make boot fails

2000-05-31 Thread Josef Sveningsson

Hi!

I try to build the hslibs. When I do 'make boot' I get the following:


==fptools== gmake boot --no-print-directory -r;
 in /users/cs/josefs/fpbuild/hslibs/lang

ghc -M -optdep-f -optdep.depend  -optdep-o -optdepo-recomp -cpp
-fglasgow-exts -fvia-C -Rghc-timing -I../../ghc/includesAddr.lhs
Bits.lhs ByteArray.lhs CCall.lhs CString.lhs CTypes.lhs CTypesISO.lhs
Dynamic.lhs Exception.lhs Foreign.lhs ForeignObj.lhs GlaExts.lhs
IOExts.lhs Int.lhs LazyST.lhs MutableArray.lhs NativeInfo.lhs NumExts.lhs
PackedString.lhs ST.lhs ShowFunctions.lhs Stable.lhs StableName.lhs
StablePtr.lhs Storable.lhs TimeExts.lhs Weak.lhs Word.lhs ArrayBase.hs
IArray.hs MArray.hs
:67: #error Alas, no long available...
mkdependHS: Running cpp ( on CTypes.lhs ) failed
gmake[2]: *** [depend] Error 1
gmake[1]: *** [boot] Error 1
gmake: *** [boot] Error 1

Sources were checked out today.

/Josef





Re: Traditional bogus warnings

2000-05-31 Thread Josef Sveningsson

Hi!

The first warning is really easy to get rid of. I'm sending a patch that
does the job (*). The other ones requires some more work.

/Josef

(*) The code compiles but I haven't actually tested it since I'm having
problems compiling the libraries from the current cvs. So, be careful with
the code ;-)

On Sun, 28 May 2000, Sven Panne wrote:

 I know that those warnings below are longstanding buglets, but would
 it be possible to remove them before the release of 4.07? I had a
 medium-quick look at the desugarer/type checker, but with no real
 success.
 
 -
 module Foo where
 import Complex
 
 bar :: String - Int
 bar "ab" = 1
 bar "c"  = 2
 bar _= 3
 
 baz :: Complex Float - Int
 baz 0= 11
 baz (_ :+ _) = 22
 -
 panne@jeanluc:~  ghc -Wall -c Foo.hs
 
 Foo.hs:5: Pattern match(es) are overlapped in the definition of function
 `bar':
   bar "c" = ...
 
 Foo.hs:10: Pattern match(es) are overlapped in the definition of
 function `baz':
   baz (_ (:+) _) = ...
 
 Foo.hs:10: Pattern match(es) are non-exhaustive in the definition of
 function `baz':
   Patterns not matched: (#x) with (#x) `notElem` [0]
 -
 
 Cheers,
Sven
 -- 
 Sven PanneTel.: +49/89/2178-2235
 LMU, Institut fuer Informatik FAX : +49/89/2178-2211
 LFE Programmier- und Modellierungssprachen  Oettingenstr. 67
 mailto:[EMAIL PROTECTED]D-80538 Muenchen
 http://www.informatik.uni-muenchen.de/~Sven.Panne
 
 


Index: DsUtils.lhs
===
RCS file: /cvs/fptools/ghc/compiler/deSugar/DsUtils.lhs,v
retrieving revision 1.44
diff -c -r1.44 DsUtils.lhs
*** DsUtils.lhs 2000/05/25 12:41:16 1.44
--- DsUtils.lhs 2000/05/31 15:12:01
***
*** 91,101 
| lit_ty == floatTy   = ConPat floatDataCon  lit_ty [] [] [LitPat 
(mk_float lit)  floatPrimTy]
| lit_ty == doubleTy  = ConPat doubleDataCon lit_ty [] [] [LitPat 
(mk_double lit) doublePrimTy]
  
!   -- Convert the literal pattern "" to the constructor pattern [].
!   | null_str_lit lit   = ConPat nilDataCon lit_ty [] [] [] 
!   -- Similar special case for "x"
!   | one_str_lit   lit= ConPat consDataCon lit_ty [] [] 
!   [mk_first_char_lit lit, ConPat nilDataCon lit_ty [] [] 
[]]
  
| otherwise = default_pat
  
--- 91,98 
| lit_ty == floatTy   = ConPat floatDataCon  lit_ty [] [] [LitPat 
(mk_float lit)  floatPrimTy]
| lit_ty == doubleTy  = ConPat doubleDataCon lit_ty [] [] [LitPat 
(mk_double lit) doublePrimTy]
  
!   -- Convert literal patterns like "foo" to 'f':'o':'o':[]
!   | str_lit lit   = mk_list lit
  
| otherwise = default_pat
  
***
*** 121,129 
  null_str_lit (HsString s) = _NULL_ s
  null_str_lit other_lit= False
  
! one_str_lit (HsString s) = _LENGTH_ s == (1::Int)
! one_str_lit other_lit= False
! mk_first_char_lit (HsString s) = ConPat charDataCon charTy [] [] [LitPat 
(HsCharPrim (_HEAD_ s)) charPrimTy]
  \end{code}
  
  
--- 118,131 
  null_str_lit (HsString s) = _NULL_ s
  null_str_lit other_lit= False
  
! str_lit (HsString s) = True
! str_lit _= False
! 
! mk_list (HsString s) = foldr
!   (\c pat - ConPat consDataCon lit_ty [] [] [mk_char_lit c,pat])
!   (ConPat nilDataCon lit_ty [] [] []) (_UNPK_ s)
! 
! mk_char_lit c= ConPat charDataCon charTy [] [] [LitPat (HsCharPrim 
c) charPrimTy]
  \end{code}
  
  



Re: strange selectee 11

2000-02-14 Thread Josef Sveningsson

Hi guys!

On Mon, 14 Feb 2000, Alastair Reid wrote:

 
  Thinking about this more, the error msg has a familiar sound
  to it.  Did you use 4.04 patchlevel 0 or 1 ? pl 0 has some
  rts-ish probs which were fixed in pl1 (and of course in 4.06).
 
 The Glorious Glasgow Haskell Compilation System, version 4.04, patchlevel 1
 
 My program is just a plain old compiler.  No concurrency, all I/O is
 through readFile and writeFile.  There is a little GreenCard stuff
 (the DFS library is just too slow when run under Hugs) - but it just
 marshalls Ints and the like (ie no foreigns or stables).
 
 It could take a few days to get 4.06 installed - I'll submit a request
 and get back to you.
 
I also managed to get the 'strange selectee' error but with number 27
instead while compiling.
The thing is that I'm running ghc 4.06 . The file I compiled was a Lex
generated file.

/Josef




Re: strange selectee 11

2000-02-14 Thread Josef Sveningsson

Sorry for replying on my own posting but...

On Mon, 14 Feb 2000, Josef Sveningsson wrote:

 I also managed to get the 'strange selectee' error but with number 27
 instead while compiling.
 The thing is that I'm running ghc 4.06 . The file I compiled was a Lex
 generated file.
 
OK, now you all say "No wonder he gets an error message when he compiles
files generated from Lex!". That should ofcourse be Alex.

/Josef




build error

2000-01-03 Thread Josef Sveningsson

Hi!

I'm trying to build ghc using the latest cvs sources. When I do
'gmake all' I get:

 from ../includes/Rts.h:16,
 from Itimer.c:25,
../includes/PrimOps.h:806: parse error before `sigset_t'
../includes/PrimOps.h:806: warning: function declaration isn't a prototype
Itimer.c:185: storage size of `action' isn't known
Itimer.c:189: warning: implicit declaration of function `sigemptyset'
Itimer.c:192: warning: implicit declaration of function `sigaction'
Itimer.c:185: warning: unused variable `action'
Itimer.c:198: `sigset_t' undeclared (first use this function)
Itimer.c:198: (Each undeclared identifier is reported only once
Itimer.c:198: for each function it appears in.)
Itimer.c:198: parse error before `signals'
Itimer.c:200: `signals' undeclared (first use this function)
Itimer.c:201: warning: implicit declaration of function `sigaddset'
Itimer.c:203: warning: implicit declaration of function `sigprocmask'
Itimer.c:209: `sigset_t' undeclared (first use this function)
Itimer.c:209: parse error before `signals'
Itimer.c:211: `signals' undeclared (first use this function)
gmake[2]: *** [Itimer.o] Error 1
gmake[1]: *** [all] Error 1
gmake: *** [all] Error 1

I'm using an UltraSparc running SunOS 5.6

/Josef

--
|Josef Svenningsson|http://www.dtek.chalmers.se/~d95josef|
|Rubingatan 39 |  email: [EMAIL PROTECTED]   |
|421 62 Göteborg   |  tel: 031-7090774   |
--
What is a magician but a practising theorist?
-- Obi-Wan Kenobi