[project @ 1999-02-02 13:26:31 by sof]
[ghc-hetmet.git] / ghc / lib / exts / Word.lhs
1 %
2 % (c) The AQUA Project, Glasgow University, 1997
3 %
4 \section[Word]{Module @Word@}
5
6 GHC implementation of the standard Hugs/GHC @Word@
7 interface, types and operations over unsigned, sized
8 quantities.
9
10 \begin{code}
11 #include "MachDeps.h"
12
13 module Word
14         ( Word8          -- all abstract.
15         , Word16         -- instances: Eq, Ord
16         , Word32         --  Num, Bounded, Real,
17         , Word64         --  Integral, Ix, Enum,
18                          --  Read, Show, Bits,
19                          --  CCallable, CReturnable
20                          --  (last two are GHC specific.)
21
22         , word8ToWord16   -- :: Word8  -> Word16
23         , word8ToWord32   -- :: Word8  -> Word32
24         , word8ToWord64   -- :: Word8  -> Word64
25
26         , word16ToWord8   -- :: Word16 -> Word32
27         , word16ToWord32  -- :: Word16 -> Word32
28         , word16ToWord64  -- :: Word8  -> Word64
29
30         , word32ToWord8   -- :: Word32 -> Word8
31         , word32ToWord16  -- :: Word32 -> Word16
32         , word32ToWord64  -- :: Word32 -> Word64
33
34         , word64ToWord8   -- :: Word64 -> Word8
35         , word64ToWord16  -- :: Word64 -> Word16
36         , word64ToWord32  -- :: Word64 -> Word32
37         
38         , word8ToInt      -- :: Word8  -> Int
39         , word16ToInt     -- :: Word16 -> Int
40         , word32ToInt     -- :: Word32 -> Int
41         , word64ToInt     -- :: Word64 -> Int
42
43         , intToWord8      -- :: Int    -> Word8
44         , intToWord16     -- :: Int    -> Word16
45         , intToWord32     -- :: Int    -> Word32
46         , intToWord64     -- :: Int    -> Word64
47
48         , word8ToInteger  -- :: Word8   -> Integer
49         , word16ToInteger -- :: Word16  -> Integer
50         , word32ToInteger -- :: Word32  -> Integer
51         , word64ToInteger -- :: Word64  -> Integer
52
53         , integerToWord8  -- :: Integer -> Word8
54         , integerToWord16 -- :: Integer -> Word16
55         , integerToWord32 -- :: Integer -> Word32
56         , integerToWord64 -- :: Integer -> Word64
57
58         -- NB! GHC SPECIFIC:
59         , wordToWord8     -- :: Word   -> Word8
60         , wordToWord16    -- :: Word   -> Word16
61         , wordToWord32    -- :: Word   -> Word32
62         , wordToWord64    -- :: Word   -> Word64
63
64         , word8ToWord     -- :: Word8  -> Word
65         , word16ToWord    -- :: Word16 -> Word
66         , word32ToWord    -- :: Word32 -> Word
67         , word64ToWord    -- :: Word64 -> Word
68
69         -- The "official" place to get these from is Addr.
70         , indexWord8OffAddr
71         , indexWord16OffAddr
72         , indexWord32OffAddr
73         , indexWord64OffAddr
74         
75         , readWord8OffAddr
76         , readWord16OffAddr
77         , readWord32OffAddr
78         , readWord64OffAddr
79         
80         , writeWord8OffAddr
81         , writeWord16OffAddr
82         , writeWord32OffAddr
83         , writeWord64OffAddr
84         
85         , sizeofWord8
86         , sizeofWord16
87         , sizeofWord32
88         , sizeofWord64
89
90         -- The "official" place to get these from is Foreign
91 #ifndef __PARALLEL_HASKELL__
92         , indexWord8OffForeignObj
93         , indexWord16OffForeignObj
94         , indexWord32OffForeignObj
95         , indexWord64OffForeignObj
96         
97         , readWord8OffForeignObj
98         , readWord16OffForeignObj
99         , readWord32OffForeignObj
100         , readWord64OffForeignObj
101         
102         , writeWord8OffForeignObj
103         , writeWord16OffForeignObj
104         , writeWord32OffForeignObj
105         , writeWord64OffForeignObj
106 #endif
107         
108         -- non-standard, GHC specific
109         , wordToInt
110
111         -- Internal, do not use.
112         , word8ToWord#
113         , word16ToWord#
114         , word32ToWord#
115
116         ) where
117
118 #ifdef __HUGS__
119 import PreludeBuiltin
120 #else
121 import PrelBase
122 import CCall
123 import PrelForeign
124 import PrelIOBase
125 import PrelAddr
126 #endif
127 import Ix
128 import Bits
129 import Ratio
130 import Numeric (readDec, showInt)
131
132 -----------------------------------------------------------------------------
133 -- The "official" coercion functions
134 -----------------------------------------------------------------------------
135
136 word8ToWord32  :: Word8  -> Word32
137 word16ToWord32 :: Word16 -> Word32
138 word32ToWord8  :: Word32 -> Word8
139 word32ToWord16 :: Word32 -> Word16
140
141 word8ToInt      :: Word8  -> Int
142 word16ToInt     :: Word16 -> Int
143 intToWord8      :: Int    -> Word8
144 intToWord16     :: Int    -> Word16
145
146 integerToWord8  :: Integer -> Word8
147 integerToWord16 :: Integer -> Word16
148
149 word8ToInt      = word32ToInt     . word8ToWord32
150 intToWord8      = word32ToWord8   . intToWord32
151 word16ToInt     = word32ToInt     . word16ToWord32
152 intToWord16     = word32ToWord16  . intToWord32
153 word8ToInteger  = word32ToInteger . word8ToWord32
154 word16ToInteger = word32ToInteger . word16ToWord32
155 integerToWord8  = fromInteger
156 integerToWord16 = fromInteger
157
158 intToWord32 :: Int -> Word32
159 intToWord32 (I# x)   = W32# ((int2Word# x) `and#` (case (maxBound::Word32) of W32# x# -> x#))
160 --intToWord32 (I# x)   = W32# (int2Word# x)
161
162 word32ToInt :: Word32 -> Int
163 word32ToInt (W32# x) = I#   (word2Int# x)
164
165 word32ToInteger :: Word32 -> Integer
166 word32ToInteger (W32# x) = word2Integer x
167
168 integerToWord32 :: Integer -> Word32
169 integerToWord32 = fromInteger
170
171 wordToInt :: Word -> Int
172 wordToInt (W# w#) = I# (word2Int# w#)
173
174 \end{code}
175
176 \subsection[Word8]{The @Word8@ interface}
177
178 The byte type @Word8@ is represented in the Haskell
179 heap by boxing up a 32-bit quantity, @Word#@. An invariant
180 for this representation is that the higher 24 bits are
181 *always* zeroed out. A consequence of this is that
182 operations that could possibly overflow have to mask
183 out the top three bytes before building the resulting @Word8@.
184
185 \begin{code}
186 data Word8  = W8# Word#
187
188 instance CCallable Word8
189 instance CReturnable Word8
190
191 word8ToWord32 (W8#  x) = W32# x
192 word8ToWord16 (W8#  x) = W16# x
193 word32ToWord8 (W32# x) = W8# (wordToWord8# x)
194
195 -- mask out upper three bytes.
196 intToWord8# :: Int# -> Word#
197 intToWord8# i# = (int2Word# i#) `and#` (int2Word# 0xff#)
198
199 wordToWord8# :: Word# -> Word#
200 wordToWord8# w# = w# `and#` (int2Word# 0xff#)
201
202 instance Eq  Word8     where 
203   (W8# x) == (W8# y) = x `eqWord#` y
204   (W8# x) /= (W8# y) = x `neWord#` y
205
206 instance Ord Word8     where 
207   compare (W8# x#) (W8# y#) = compareWord# x# y#
208   (<)  (W8# x) (W8# y)      = x `ltWord#` y
209   (<=) (W8# x) (W8# y)      = x `leWord#` y
210   (>=) (W8# x) (W8# y)      = x `geWord#` y
211   (>)  (W8# x) (W8# y)      = x `gtWord#` y
212   max x@(W8# x#) y@(W8# y#) = 
213      case (compareWord# x# y#) of { LT -> y ; EQ -> x ; GT -> x }
214   min x@(W8# x#) y@(W8# y#) =
215      case (compareWord# x# y#) of { LT -> x ; EQ -> x ; GT -> y }
216
217 -- Helper function, used by Ord Word* instances.
218 compareWord# :: Word# -> Word# -> Ordering
219 compareWord# x# y# 
220  | x# `ltWord#` y# = LT
221  | x# `eqWord#` y# = EQ
222  | otherwise       = GT
223
224 instance Num Word8 where
225   (W8# x) + (W8# y) = 
226       W8# (intToWord8# (word2Int# x +# word2Int# y))
227   (W8# x) - (W8# y) = 
228       W8# (intToWord8# (word2Int# x -# word2Int# y))
229   (W8# x) * (W8# y) = 
230       W8# (intToWord8# (word2Int# x *# word2Int# y))
231   negate w@(W8# x)  = 
232      if x' ==# 0# 
233       then w
234       else W8# (int2Word# (0x100# -# x'))
235      where
236       x' = word2Int# x
237   abs x         = x
238   signum        = signumReal
239   fromInteger (J# a# s# d#) = W8# (wordToWord8# (integer2Word# a# s# d#))
240   fromInt       = intToWord8
241
242 instance Bounded Word8 where
243   minBound = 0
244   maxBound = 0xff
245
246 instance Real Word8 where
247   toRational x = toInteger x % 1
248
249 -- Note: no need to mask results here 
250 -- as they cannot overflow.
251 instance Integral Word8 where
252   div  x@(W8# x#)  (W8# y#) 
253     | y# `neWord#` (int2Word# 0#) = W8# (x# `quotWord#` y#)
254     | otherwise                   = divZeroError "div{Word8}" x
255
256   quot x@(W8# x#)  (W8# y#)   
257     | y# `neWord#` (int2Word# 0#) = W8# (x# `quotWord#` y#)
258     | otherwise                   = divZeroError "quot{Word8}" x
259
260   rem  x@(W8# x#)  (W8# y#)
261     | y# `neWord#` (int2Word# 0#) = W8# (x# `remWord#` y#)
262     | otherwise                   = divZeroError "rem{Word8}" x
263
264   mod  x@(W8# x#)  (W8# y#)
265     | y# `neWord#` (int2Word# 0#) = W8# (x# `remWord#` y#)
266     | otherwise                   = divZeroError "mod{Word8}" x
267
268   quotRem (W8# x) (W8# y) = (W8# (x `quotWord#` y), W8# (x `remWord#` y))
269   divMod  (W8# x) (W8# y) = (W8# (x `quotWord#` y), W8# (x `remWord#` y))
270
271   toInteger (W8# x)       = word2Integer x
272   toInt x                 = word8ToInt x
273
274 instance Ix Word8 where
275     range (m,n)          = [m..n]
276     index b@(m,_) i
277            | inRange b i = word8ToInt (i-m)
278            | otherwise   = indexError i b "Word8"
279     inRange (m,n) i      = m <= i && i <= n
280
281 instance Enum Word8 where
282     succ w          
283       | w == maxBound = succError "Word8"
284       | otherwise     = w+1
285     pred w          
286       | w == minBound = predError "Word8"
287       | otherwise     = w-1
288
289     toEnum   i@(I# i#)  
290       | i >= toInt (minBound::Word8) && i <= toInt (maxBound::Word8) 
291       = W8# (intToWord8# i#)
292       | otherwise
293       = toEnumError "Word8" i (minBound::Word8,maxBound::Word8)
294
295     fromEnum  (W8# w) = I# (word2Int# w)
296     enumFrom c        = map toEnum [fromEnum c .. fromEnum (maxBound::Word8)]
297     enumFromThen c d  = map toEnum [fromEnum c, fromEnum d .. fromEnum last]
298                         where 
299                          last :: Word8
300                          last 
301                           | d < c     = minBound
302                           | otherwise = maxBound
303
304 instance Read Word8 where
305     readsPrec _ = readDec
306
307 instance Show Word8 where
308     showsPrec _ = showInt
309
310 --
311 -- Word8s are represented by an (unboxed) 32-bit Word.
312 -- The invariant is that the upper 24 bits are always zeroed out.
313 --
314 instance Bits Word8 where
315   (W8# x)  .&.  (W8# y)    = W8# (x `and#` y)
316   (W8# x)  .|.  (W8# y)    = W8# (x `or#` y)
317   (W8# x) `xor` (W8# y)    = W8# (x `xor#` y)
318   complement (W8# x)       = W8# (x `xor#` int2Word# 0xff#)
319   shift (W8# x#) i@(I# i#)
320         | i > 0     = W8# (wordToWord8# (shiftL# x# i#))
321         | otherwise = W8# (wordToWord8# (shiftRL# x# (negateInt# i#)))
322   w@(W8# x)  `rotate` (I# i)
323         | i ==# 0#    = w
324         | i ># 0#     = W8# ((wordToWord8# (shiftL# x i')) `or#`
325                              (shiftRL# (x `and#` 
326                                         (int2Word# (0x100# -# pow2# i2)))
327                                        i2))
328         | otherwise = rotate w (I# (8# +# i))
329           where
330            i' = word2Int# (int2Word# i `and#` int2Word# 7#)
331            i2 = 8# -# i'
332
333   bit (I# i#)
334         | i# >=# 0# && i# <=# 7# = W8# (wordToWord8# (shiftL# (int2Word# 1#) i#))
335         | otherwise = 0 -- We'll be overbearing, for now..
336
337   setBit x i    = x .|. bit i
338   clearBit x i  = x .&. complement (bit i)
339   complementBit x i = x `xor` bit i
340
341   testBit (W8# x#) (I# i#)
342     | i# <# 8# && i# >=# 0# = (word2Int# (x# `and#` (shiftL# (int2Word# 1#) i#))) /=# 0#
343     | otherwise             = False -- for now, this is really an error.
344
345   bitSize  _    = 8
346   isSigned _    = False
347
348 pow2# :: Int# -> Int#
349 pow2# x# = word2Int# (shiftL# (int2Word# 1#) x#)
350
351 word2Integer :: Word# -> Integer
352 word2Integer w = case word2Integer# w of
353                         (# a, s, d #) -> J# a s d
354
355 pow2_64# :: Int# -> Int64#
356 pow2_64# x# = word64ToInt64# (shiftL64# (wordToWord64# (int2Word# 1#)) x#)
357
358 sizeofWord8 :: Word32
359 sizeofWord8 = 1
360
361 \end{code}
362
363 \subsection[Word16]{The @Word16@ interface}
364
365 The double byte type @Word16@ is represented in the Haskell
366 heap by boxing up a machine word, @Word#@. An invariant
367 for this representation is that only the lower 16 bits are
368 `active', any bits above are {\em always} zeroed out.
369 A consequence of this is that operations that could possibly
370 overflow have to mask out anything above the lower two bytes
371 before putting together the resulting @Word16@.
372
373 \begin{code}
374 data Word16 = W16# Word#
375 instance CCallable Word16
376 instance CReturnable Word16
377
378 word16ToWord32 (W16# x) = W32# x
379 word16ToWord8  (W16# x) = W8# (wordToWord8# x)
380 word32ToWord16 (W32# x) = W16# (wordToWord16# x)
381
382 -- mask out upper 16 bits.
383 intToWord16# :: Int# -> Word#
384 intToWord16# i# = ((int2Word# i#) `and#` (int2Word# 0xffff#))
385
386 wordToWord16# :: Word# -> Word#
387 wordToWord16# w# = w# `and#` (int2Word# 0xffff#)
388
389 instance Eq  Word16    where 
390   (W16# x) == (W16# y) = x `eqWord#` y
391   (W16# x) /= (W16# y) = x `neWord#` y
392
393 instance Ord Word16     where
394   compare (W16# x#) (W16# y#) = compareWord# x# y#
395   (<)  (W16# x) (W16# y)      = x `ltWord#` y
396   (<=) (W16# x) (W16# y)      = x `leWord#` y
397   (>=) (W16# x) (W16# y)      = x `geWord#` y
398   (>)  (W16# x) (W16# y)      = x `gtWord#` y
399   max x@(W16# x#) y@(W16# y#) = 
400      case (compareWord# x# y#) of { LT -> y ; EQ -> x ; GT -> x }
401   min x@(W16# x#) y@(W16# y#) =
402      case (compareWord# x# y#) of { LT -> x ; EQ -> x ; GT -> y }
403
404 instance Num Word16 where
405   (W16# x) + (W16# y) = 
406        W16# (intToWord16# (word2Int# x +# word2Int# y))
407   (W16# x) - (W16# y) = 
408        W16# (intToWord16# (word2Int# x -# word2Int# y))
409   (W16# x) * (W16# y) = 
410        W16# (intToWord16# (word2Int# x *# word2Int# y))
411   negate w@(W16# x)  = 
412        if x' ==# 0# 
413         then w
414         else W16# (int2Word# (0x10000# -# x'))
415        where
416         x' = word2Int# x
417   abs x         = x
418   signum        = signumReal
419   fromInteger (J# a# s# d#) = W16# (wordToWord16# (integer2Word# a# s# d#))
420   fromInt       = intToWord16
421
422 instance Bounded Word16 where
423   minBound = 0
424   maxBound = 0xffff
425
426 instance Real Word16 where
427   toRational x = toInteger x % 1
428
429 instance Integral Word16 where
430   div  x@(W16# x#)  (W16# y#)
431    | y# `neWord#` (int2Word# 0#) = W16# (x# `quotWord#` y#)
432    | otherwise                   = divZeroError "div{Word16}" x
433
434   quot x@(W16# x#) (W16# y#)
435    | y# `neWord#`(int2Word# 0#)  = W16# (x# `quotWord#` y#)
436    | otherwise                   = divZeroError "quot{Word16}" x
437
438   rem  x@(W16# x#) (W16# y#)
439    | y# `neWord#` (int2Word# 0#) = W16# (x# `remWord#` y#)
440    | otherwise                   = divZeroError "rem{Word16}" x
441
442   mod  x@(W16# x#)  (W16# y#)
443    | y# `neWord#` (int2Word# 0#) = W16# (x# `remWord#` y#)
444    | otherwise                   = divZeroError "mod{Word16}" x
445
446   quotRem (W16# x) (W16# y) = (W16# (x `quotWord#` y), W16# (x `remWord#` y))
447   divMod  (W16# x) (W16# y) = (W16# (x `quotWord#` y), W16# (x `remWord#` y))
448
449   toInteger (W16# x)        = word2Integer x
450   toInt x                   = word16ToInt x
451
452 instance Ix Word16 where
453   range (m,n)          = [m..n]
454   index b@(m,_) i
455          | inRange b i = word16ToInt (i - m)
456          | otherwise   = indexError i b "Word16"
457   inRange (m,n) i      = m <= i && i <= n
458
459 instance Enum Word16 where
460     succ w          
461       | w == maxBound = succError "Word16"
462       | otherwise     = w+1
463     pred w
464       | w == minBound = predError "Word16"
465       | otherwise     = w-1
466
467     toEnum   i@(I# i#)  
468       | i >= toInt (minBound::Word16) && i <= toInt (maxBound::Word16)
469       = W16# (intToWord16# i#)
470       | otherwise
471       = toEnumError "Word16" i (minBound::Word16,maxBound::Word16)
472
473     fromEnum  (W16# w) = I# (word2Int# w)
474     enumFrom c       = map toEnum [fromEnum c .. fromEnum (maxBound::Word16)]
475     enumFromThen c d = map toEnum [fromEnum c, fromEnum d .. fromEnum last]
476                        where 
477                          last :: Word16
478                          last 
479                           | d < c     = minBound
480                           | otherwise = maxBound
481
482 instance Read Word16 where
483   readsPrec _ = readDec
484
485 instance Show Word16 where
486   showsPrec _ = showInt
487
488 instance Bits Word16 where
489   (W16# x)  .&.  (W16# y)  = W16# (x `and#` y)
490   (W16# x)  .|.  (W16# y)  = W16# (x `or#` y)
491   (W16# x) `xor` (W16# y)  = W16# (x `xor#` y)
492   complement (W16# x)      = W16# (x `xor#` int2Word# 0xffff#)
493   shift (W16# x#) i@(I# i#)
494         | i > 0     = W16# (wordToWord16# (shiftL# x# i#))
495         | otherwise = W16# (shiftRL# x# (negateInt# i#))
496   w@(W16# x)  `rotate` (I# i)
497         | i ==# 0#    = w
498         | i ># 0#     = W16# ((wordToWord16# (shiftL# x i')) `or#`
499                               (shiftRL# (x `and#` 
500                                          (int2Word# (0x10000# -# pow2# i2)))
501                                         i2))
502         | otherwise = rotate w (I# (16# +# i'))
503           where
504            i' = word2Int# (int2Word# i `and#` int2Word# 15#)
505            i2 = 16# -# i'
506   bit (I# i#)
507         | i# >=# 0# && i# <=# 15# = W16# (shiftL# (int2Word# 1#) i#)
508         | otherwise = 0 -- We'll be overbearing, for now..
509
510   setBit x i    = x .|. bit i
511   clearBit x i  = x .&. complement (bit i)
512   complementBit x i = x `xor` bit i
513
514   testBit (W16# x#) (I# i#)
515     | i# <# 16# && i# >=# 0# = (word2Int# (x# `and#` (shiftL# (int2Word# 1#) i#))) /=# 0#
516     | otherwise             = False -- for now, this is really an error.
517
518   bitSize  _    = 16
519   isSigned _    = False
520
521
522 sizeofWord16 :: Word32
523 sizeofWord16 = 2
524
525 \end{code}
526
527 \subsection[Word32]{The @Word32@ interface}
528
529 The quad byte type @Word32@ is represented in the Haskell
530 heap by boxing up a machine word, @Word#@. An invariant
531 for this representation is that any bits above the lower
532 32 are {\em always} zeroed out. A consequence of this is that
533 operations that could possibly overflow have to mask
534 the result before building the resulting @Word16@.
535
536 \begin{code}
537 data Word32 = W32# Word#
538
539 instance CCallable Word32
540 instance CReturnable Word32
541
542 instance Eq  Word32    where 
543   (W32# x) == (W32# y) = x `eqWord#` y
544   (W32# x) /= (W32# y) = x `neWord#` y
545
546 instance Ord Word32    where
547   compare (W32# x#) (W32# y#) = compareWord# x# y#
548   (<)  (W32# x) (W32# y)      = x `ltWord#` y
549   (<=) (W32# x) (W32# y)      = x `leWord#` y
550   (>=) (W32# x) (W32# y)      = x `geWord#` y
551   (>)  (W32# x) (W32# y)      = x `gtWord#` y
552   max x@(W32# x#) y@(W32# y#) = 
553      case (compareWord# x# y#) of { LT -> y ; EQ -> x ; GT -> x }
554   min x@(W32# x#) y@(W32# y#) =
555      case (compareWord# x# y#) of { LT -> x ; EQ -> x ; GT -> y }
556
557 instance Num Word32 where
558   (W32# x) + (W32# y) = 
559        W32# (intToWord32# (word2Int# x +# word2Int# y))
560   (W32# x) - (W32# y) =
561        W32# (intToWord32# (word2Int# x -# word2Int# y))
562   (W32# x) * (W32# y) = 
563        W32# (intToWord32# (word2Int# x *# word2Int# y))
564 #if WORD_SIZE_IN_BYTES == 8
565   negate w@(W32# x)  = 
566       if x' ==# 0#
567        then w
568        else W32# (intToWord32# (0x100000000# -# x'))
569        where
570         x' = word2Int# x
571 #else
572   negate (W32# x)  = W32# (intToWord32# (negateInt# (word2Int# x)))
573 #endif
574   abs x           = x
575   signum          = signumReal
576   fromInteger (J# a# s# d#) = W32# (integer2Word# a# s# d#)
577   fromInt (I# x)  = W32# (intToWord32# x)
578     -- ToDo: restrict fromInt{eger} range.
579
580 intToWord32#  :: Int#  -> Word#
581 wordToWord32# :: Word# -> Word#
582
583 #if WORD_SIZE_IN_BYTES == 8
584 intToWord32#  i#  = (int2Word# i#) `and#` (int2Word# 0xffffffff#)
585 wordToWord32# w#  = w# `and#` (int2Word# 0xffffffff#)
586 wordToWord64# w#  = w#
587 #else
588 intToWord32#  i# = int2Word# i#
589 wordToWord32# w# = w#
590
591 #endif
592
593 instance Bounded Word32 where
594     minBound = 0
595 #if WORD_SIZE_IN_BYTES == 8
596     maxBound = 0xffffffff
597 #else
598     maxBound = minBound - 1
599 #endif
600
601 instance Real Word32 where
602     toRational x = toInteger x % 1
603
604 instance Integral Word32 where
605     div  x y 
606       | y /= 0         = quotWord32 x y
607       | otherwise      = divZeroError "div{Word32}" x
608
609     quot x y
610       | y /= 0         = quotWord32 x y
611       | otherwise      = divZeroError "quot{Word32}" x
612
613     rem  x y
614       | y /= 0         = remWord32 x y
615       | otherwise      = divZeroError "rem{Word32}" x
616
617     mod  x y
618       | y /= 0         = remWord32 x y
619       | otherwise      = divZeroError "mod{Word32}" x
620
621     quotRem a b        = (a `quotWord32` b, a `remWord32` b)
622     divMod x y         = quotRem x y
623
624     toInteger (W32# x) = word2Integer x
625     toInt     (W32# x) = I# (word2Int# x)
626
627 {-# INLINE quotWord32 #-}
628 {-# INLINE remWord32  #-}
629 remWord32, quotWord32 :: Word32 -> Word32 -> Word32
630 (W32# x) `quotWord32` (W32# y) = W32# (x `quotWord#` y)
631 (W32# x) `remWord32`  (W32# y) = W32# (x `remWord#`  y)
632
633 instance Ix Word32 where
634     range (m,n)          = [m..n]
635     index b@(m,_) i
636            | inRange b i = word32ToInt (i - m)
637            | otherwise   = indexError i b "Word32"
638     inRange (m,n) i      = m <= i && i <= n
639
640 instance Enum Word32 where
641     succ w          
642       | w == maxBound = succError "Word32"
643       | otherwise     = w+1
644     pred w          
645       | w == minBound = predError "Word32"
646       | otherwise     = w-1
647
648      -- the toEnum/fromEnum will fail if the mapping isn't legal,
649      -- use the intTo* & *ToInt coercion functions to 'bypass' these range checks.
650     toEnum   x
651       | x >= 0    = intToWord32 x
652       | otherwise
653       = toEnumError "Word32" x (minBound::Word32,maxBound::Word32)
654
655     fromEnum   x
656       | x <= intToWord32 (maxBound::Int)
657       = word32ToInt x
658       | otherwise
659       = fromEnumError "Word32" x
660
661     enumFrom w           = [w .. maxBound]
662     enumFromTo   w1 w2
663        | w1 <= w2        = eftt32 True{-increasing-} w1 diff_f last
664        | otherwise       = []
665         where
666          last = (> w2)
667          diff_f x = x + 1 
668           
669     enumFromThen w1 w2   = [w1,w2 .. last]
670        where
671          last :: Word32
672          last
673           | w1 <=w2   = maxBound
674           | otherwise = minBound
675
676     enumFromThenTo w1 w2 wend  = eftt32 increasing w1 step_f last
677      where
678        increasing = w1 <= w2
679        diff1 = w2 - w1
680        diff2 = w1 - w2
681        
682        last
683         | increasing = (> wend)
684         | otherwise  = (< wend)
685
686        step_f 
687         | increasing = \ x -> x + diff1
688         | otherwise  = \ x -> x - diff2
689
690
691 eftt32 :: Bool -> Word32 -> (Word32 -> Word32) -> (Word32-> Bool) -> [Word32]
692 eftt32 increasing init stepper done = go init
693   where
694     go now
695      | done now                    = []
696      | increasing     && now > nxt = [now] -- oflow
697      | not increasing && now < nxt = [now] -- uflow
698      | otherwise                   = now : go nxt
699      where
700       nxt = stepper now 
701
702
703 instance Read Word32 where
704     readsPrec _ = readDec
705
706 instance Show Word32 where
707     showsPrec _ = showInt
708
709 instance Bits Word32 where
710   (W32# x)  .&.  (W32# y)  = W32# (x `and#` y)
711   (W32# x)  .|.  (W32# y)  = W32# (x `or#` y)
712   (W32# x) `xor` (W32# y)  = W32# (x `xor#` y)
713   complement (W32# x)      = W32# (x `xor#` mb#) where (W32# mb#) = maxBound
714   shift (W32# x) i@(I# i#)
715         | i > 0     = W32# (wordToWord32# (shiftL# x i#))
716         | otherwise = W32# (shiftRL# x (negateInt# i#))
717   w@(W32# x)  `rotate` (I# i)
718         | i ==# 0#    = w
719         | i ># 0#     = W32# ((wordToWord32# (shiftL# x i')) `or#`
720                               (shiftRL# (x `and#` 
721                                         (int2Word# (word2Int# maxBound# -# pow2# i2 +# 1#)))
722                                      i2))
723         | otherwise = rotate w (I# (32# +# i))
724           where
725            i' = word2Int# (int2Word# i `and#` int2Word# 31#)
726            i2 = 32# -# i'
727            (W32# maxBound#) = maxBound
728
729   bit (I# i#)
730         | i# >=# 0# && i# <=# 31# = W32# (shiftL# (int2Word# 1#) i#)
731         | otherwise = 0 -- We'll be overbearing, for now..
732
733   setBit x i        = x .|. bit i
734   clearBit x i      = x .&. complement (bit i)
735   complementBit x i = x `xor` bit i
736
737   testBit (W32# x#) (I# i#)
738     | i# <# 32# && i# >=# 0# = (word2Int# (x# `and#` (shiftL# (int2Word# 1#) i#))) /=# 0#
739     | otherwise             = False -- for now, this is really an error.
740   bitSize  _        = 32
741   isSigned _        = False
742
743 sizeofWord32 :: Word32
744 sizeofWord32 = 4
745 \end{code}
746
747 \subsection[Word64]{The @Word64@ interface}
748
749 \begin{code}
750 #if WORD_SIZE_IN_BYTES == 8
751 --data Word64 = W64# Word#
752
753 word32ToWord64 :: Word32 -> Word64
754 word32ToWord64 (W32 w#) = W64# w#
755
756 word8ToWord64 :: Word8 -> Word64
757 word8ToWord64 (W8# w#) = W64# w#
758
759 word64ToWord8 :: Word64 -> Word8
760 word64ToWord8 (W64# w#) = W8# (w# `and#` (int2Word# 0xff#))
761
762 word16ToWord64 :: Word16 -> Word64
763 word16ToWord64 (W16# w#) = W64# w#
764
765 word64ToWord16 :: Word64 -> Word16
766 word64ToWord16 (W64# w#) = W16# (w# `and#` (int2Word# 0xffff#))
767
768 wordToWord32# :: Word# -> Word#
769 wordToWord32# w# = w# `and#` (case (maxBound::Word32) of W# x# -> x#)
770
771 word64ToWord32 :: Word64 -> Word32
772 word64ToWord32 (W64# w#) = W32# (wordToWord32# w#)
773
774 wordToWord64# w# = w#
775 word64ToWord# w# = w#
776
777 instance Eq  Word64     where 
778   (W64# x) == (W64# y) = x `eqWord#` y
779   (W64# x) /= (W64# y) = x `neWord#` y
780
781 instance Ord Word64     where 
782   compare (W64# x#) (W64# y#) = compareWord# x# y#
783   (<)  (W64# x) (W64# y)      = x `ltWord#` y
784   (<=) (W64# x) (W64# y)      = x `leWord#` y
785   (>=) (W64# x) (W64# y)      = x `geWord#` y
786   (>)  (W64# x) (W64# y)      = x `gtWord#` y
787   max x@(W64# x#) y@(W64# y#) = 
788      case (compareWord# x# y#) of { LT -> y ; EQ -> x ; GT -> x }
789   min x@(W64# x#) y@(W64# y#) =
790      case (compareWord# x# y#) of { LT -> x ; EQ -> x ; GT -> y }
791
792 instance Num Word64 where
793   (W64# x) + (W64# y) = 
794       W64# (intToWord64# (word2Int# x +# word2Int# y))
795   (W64# x) - (W64# y) = 
796       W64# (intToWord64# (word2Int# x -# word2Int# y))
797   (W64# x) * (W64# y) = 
798       W64# (intToWord64# (word2Int# x *# word2Int# y))
799   negate w@(W64# x)  = 
800      if x' ==# 0# 
801       then w
802       else W64# (int2Word# (0x100# -# x'))
803      where
804       x' = word2Int# x
805   abs x         = x
806   signum        = signumReal
807   fromInteger (J# a# s# d#) = W64# (integer2Word# a# s# d#)
808   fromInt       = intToWord64
809
810 -- Note: no need to mask results here 
811 -- as they cannot overflow.
812 instance Integral Word64 where
813   div  x@(W64# x#)  (W64# y#)
814     | y# `neWord#` (int2Word# 0#)  = W64# (x# `quotWord#` y#)
815     | otherwise                    = divZeroError "div{Word64}" x
816
817   quot x@(W64# x#)  (W64# y#)
818     | y# `neWord#` (int2Word# 0#)  = W64# (x# `quotWord#` y#)
819     | otherwise                    = divZeroError "quot{Word64}" x
820
821   rem  x@(W64# x#)  (W64# y#)
822     | y# `neWord#` (int2Word# 0#)  = W64# (x# `remWord#` y#)
823     | otherwise                    = divZeroError "rem{Word64}" x
824
825   mod  (W64# x)  (W64# y)   
826     | y# `neWord#` (int2Word# 0#)  = W64# (x `remWord#` y)
827     | otherwise                    = divZeroError "mod{Word64}" x
828
829   quotRem (W64# x) (W64# y) = (W64# (x `quotWord#` y), W64# (x `remWord#` y))
830   divMod  (W64# x) (W64# y) = (W64# (x `quotWord#` y), W64# (x `remWord#` y))
831
832   toInteger (W64# x)        = word2Integer# x
833   toInt x                   = word64ToInt x
834
835
836 instance Bits Word64 where
837   (W64# x)  .&.  (W64# y)    = W64# (x `and#` y)
838   (W64# x)  .|.  (W64# y)    = W64# (x `or#` y)
839   (W64# x) `xor` (W64# y)    = W64# (x `xor#` y)
840   complement (W64# x)        = W64# (x `xor#` (case (maxBound::Word64) of W64# x# -> x#))
841   shift (W64# x#) i@(I# i#)
842         | i > 0     = W64# (shiftL# x# i#)
843         | otherwise = W64# (shiftRL# x# (negateInt# i#))
844
845   w@(W64# x)  `rotate` (I# i)
846         | i ==# 0#    = w
847         | i ># 0#     = W64# (shiftL# x i') `or#`
848                               (shiftRL# (x `and#` 
849                                         (int2Word# (word2Int# maxBound# -# pow2# i2 +# 1#)))
850                                      i2))
851         | otherwise = rotate w (I# (64# +# i))
852           where
853            i' = word2Int# (int2Word# i `and#` int2Word# 63#)
854            i2 = 64# -# i'
855            (W64# maxBound#) = maxBound
856
857   bit (I# i#)
858         | i# >=# 0# && i# <=# 63# = W64# (shiftL# (int2Word# 1#) i#)
859         | otherwise = 0 -- We'll be overbearing, for now..
860
861   setBit x i    = x .|. bit i
862   clearBit x i  = x .&. complement (bit i)
863   complementBit x i = x `xor` bit i
864
865   testBit (W64# x#) (I# i#)
866     | i# <# 64# && i# >=# 0# = (word2Int# (x# `and#` (shiftL# (int2Word# 1#) i#))) /=# 0#
867     | otherwise              = False -- for now, this is really an error.
868
869   bitSize  _    = 64
870   isSigned _    = False
871
872 #else
873 --defined in PrelCCall: data Word64 = W64 Word64# deriving (Eq, Ord, Bounded)
874
875 -- for completeness sake
876 word32ToWord64 :: Word32 -> Word64
877 word32ToWord64 (W32# w#) = W64# (wordToWord64# w#)
878
879 word64ToWord32 :: Word64 -> Word32
880 word64ToWord32 (W64# w#) = W32# (word64ToWord# w#)
881
882 word8ToWord64 :: Word8 -> Word64
883 word8ToWord64 (W8# w#) = W64# (wordToWord64# w#)
884
885 word64ToWord8 :: Word64 -> Word8
886 word64ToWord8 (W64# w#) = W8# ((word64ToWord# w#) `and#` (int2Word# 0xff#))
887
888 word16ToWord64 :: Word16 -> Word64
889 word16ToWord64 (W16# w#) = W64# (wordToWord64# w#)
890
891 word64ToWord16 :: Word64 -> Word16
892 word64ToWord16 (W64# w#) = W16# ((word64ToWord# w#) `and#` (int2Word# 0xffff#))
893
894
895 word64ToInteger :: Word64 -> Integer
896 word64ToInteger (W64# w#) = 
897   case word64ToInteger# w# of
898     (# a#, s#, p# #) -> J# a# s# p#
899
900 word64ToInt :: Word64 -> Int
901 word64ToInt w = 
902    case w `quotRem` 0x100000000 of 
903      (_,l) -> toInt (word64ToWord32 l)
904
905 intToWord64# :: Int# -> Word64#
906 intToWord64# i# = wordToWord64# (int2Word# i#)
907
908 intToWord64 :: Int -> Word64
909 intToWord64 (I# i#) = W64# (intToWord64# i#)
910
911 integerToWord64 :: Integer -> Word64
912 integerToWord64 (J# a# s# d#) = W64# (integerToWord64# a# s# d#)
913
914 instance Eq  Word64     where 
915   (W64# x) == (W64# y) = x `eqWord64#` y
916   (W64# x) /= (W64# y) = not (x `eqWord64#` y)
917
918 instance Ord Word64     where 
919   compare (W64# x#) (W64# y#) = compareWord64# x# y#
920   (<)  (W64# x) (W64# y)      = x `ltWord64#` y
921   (<=) (W64# x) (W64# y)      = x `leWord64#` y
922   (>=) (W64# x) (W64# y)      = x `geWord64#` y
923   (>)  (W64# x) (W64# y)      = x `gtWord64#` y
924   max x@(W64# x#) y@(W64# y#) = 
925      case (compareWord64# x# y#) of { LT -> y ; EQ -> x ; GT -> x }
926   min x@(W64# x#) y@(W64# y#) =
927      case (compareWord64# x# y#) of { LT -> x ; EQ -> x ; GT -> y }
928
929 instance Num Word64 where
930   (W64# x) + (W64# y) = 
931       W64# (int64ToWord64# (word64ToInt64# x `plusInt64#` word64ToInt64# y))
932   (W64# x) - (W64# y) = 
933       W64# (int64ToWord64# (word64ToInt64# x `minusInt64#` word64ToInt64# y))
934   (W64# x) * (W64# y) = 
935       W64# (int64ToWord64# (word64ToInt64# x `timesInt64#` word64ToInt64# y))
936   negate w
937      | w == 0     = w
938      | otherwise  = maxBound - w
939
940   abs x         = x
941   signum        = signumReal
942   fromInteger i = integerToWord64 i
943   fromInt       = intToWord64
944
945 -- Note: no need to mask results here 
946 -- as they cannot overflow.
947 -- ToDo: protect against div by zero.
948 instance Integral Word64 where
949   div  (W64# x)  (W64# y)   = W64# (x `quotWord64#` y)
950   quot (W64# x)  (W64# y)   = W64# (x `quotWord64#` y)
951   rem  (W64# x)  (W64# y)   = W64# (x `remWord64#` y)
952   mod  (W64# x)  (W64# y)   = W64# (x `remWord64#` y)
953   quotRem (W64# x) (W64# y) = (W64# (x `quotWord64#` y), W64# (x `remWord64#` y))
954   divMod  (W64# x) (W64# y) = (W64# (x `quotWord64#` y), W64# (x `remWord64#` y))
955   toInteger w64             = word64ToInteger w64
956   toInt x                   = word64ToInt x
957
958
959 instance Bits Word64 where
960   (W64# x)  .&.  (W64# y)    = W64# (x `and64#` y)
961   (W64# x)  .|.  (W64# y)    = W64# (x `or64#` y)
962   (W64# x) `xor` (W64# y)    = W64# (x `xor64#` y)
963   complement (W64# x)        = W64# (x `xor64#` (case (maxBound::Word64) of W64# x# -> x#))
964   shift (W64# x#) i@(I# i#)
965         | i > 0     = W64# (shiftL64# x# i#)
966         | otherwise = W64# (shiftRL64# x# (negateInt# i#))
967
968   w@(W64# x)  `rotate` (I# i)
969         | i ==# 0#    = w
970         | i ># 0#     = W64# ((shiftL64# x i') `or64#`
971                               (shiftRL64# (x `and64#` 
972                                            (int64ToWord64# ((word64ToInt64# maxBound#) `minusInt64#` 
973                                                            (pow2_64# i2 `plusInt64#` (intToInt64# 1#))))))
974                                      i2)
975         | otherwise = rotate w (I# (64# +# i))
976           where
977            i' = word2Int# (int2Word# i `and#` int2Word# 63#)
978            i2 = 64# -# i'
979            (W64# maxBound#) = maxBound
980
981   bit (I# i#)
982         | i# >=# 0# && i# <=# 63# = W64# (shiftL64# (wordToWord64# (int2Word# 1#)) i#)
983         | otherwise = 0 -- We'll be overbearing, for now..
984
985   setBit x i    = x .|. bit i
986   clearBit x i  = x .&. complement (bit i)
987   complementBit x i = x `xor` bit i
988
989   testBit (W64# x#) (I# i#)
990     | i# <# 64# && i# >=# 0# = (word2Int# (word64ToWord# (x# `and64#` (shiftL64# (wordToWord64# (int2Word# 1#)) i#)))) /=# 0#
991     | otherwise              = False -- for now, this is really an error.
992
993   bitSize  _    = 64
994   isSigned _    = False
995
996 compareWord64# :: Word64# -> Word64# -> Ordering
997 compareWord64# i# j# 
998  | i# `ltWord64#` j# = LT
999  | i# `eqWord64#` j# = EQ
1000  | otherwise         = GT
1001
1002 -- Word64# primop wrappers:
1003
1004 ltWord64# :: Word64# -> Word64# -> Bool
1005 ltWord64# x# y# =  unsafePerformIO $ do
1006         v <- _ccall_ stg_ltWord64 x# y# 
1007         case (v::Int) of
1008           0 -> return False
1009           _ -> return True
1010       
1011 leWord64# :: Word64# -> Word64# -> Bool
1012 leWord64# x# y# =  unsafePerformIO $ do
1013         v <- _ccall_ stg_leWord64 x# y# 
1014         case (v::Int) of
1015           0 -> return False
1016           _ -> return True
1017       
1018 eqWord64# :: Word64# -> Word64# -> Bool
1019 eqWord64# x# y# =  unsafePerformIO $ do
1020         v <- _ccall_ stg_eqWord64 x# y# 
1021         case (v::Int) of
1022           0 -> return False
1023           _ -> return True
1024       
1025 neWord64# :: Word64# -> Word64# -> Bool
1026 neWord64# x# y# =  unsafePerformIO $ do
1027         v <- _ccall_ stg_neWord64 x# y# 
1028         case (v::Int) of
1029           0 -> return False
1030           _ -> return True
1031       
1032 geWord64# :: Word64# -> Word64# -> Bool
1033 geWord64# x# y# =  unsafePerformIO $ do
1034         v <- _ccall_ stg_geWord64 x# y# 
1035         case (v::Int) of
1036           0 -> return False
1037           _ -> return True
1038       
1039 gtWord64# :: Word64# -> Word64# -> Bool
1040 gtWord64# x# y# =  unsafePerformIO $ do
1041         v <- _ccall_ stg_gtWord64 x# y# 
1042         case (v::Int) of
1043           0 -> return False
1044           _ -> return True
1045
1046 plusInt64# :: Int64# -> Int64# -> Int64#
1047 plusInt64# a# b# = 
1048   case (unsafePerformIO (_ccall_ stg_plusInt64 a# b#)) of
1049     I64# i# -> i#
1050
1051 minusInt64# :: Int64# -> Int64# -> Int64#
1052 minusInt64# a# b# =
1053   case (unsafePerformIO (_ccall_ stg_minusInt64 a# b#)) of
1054     I64# i# -> i#
1055
1056 timesInt64# :: Int64# -> Int64# -> Int64#
1057 timesInt64# a# b# =
1058   case (unsafePerformIO (_ccall_ stg_timesInt64 a# b#)) of
1059     I64# i# -> i#
1060
1061 quotWord64# :: Word64# -> Word64# -> Word64#
1062 quotWord64# a# b# =
1063   case (unsafePerformIO (_ccall_ stg_quotWord64 a# b#)) of
1064     W64# w# -> w#
1065
1066 remWord64# :: Word64# -> Word64# -> Word64#
1067 remWord64# a# b# =
1068   case (unsafePerformIO (_ccall_ stg_remWord64 a# b#)) of
1069     W64# w# -> w#
1070
1071 negateInt64# :: Int64# -> Int64#
1072 negateInt64# a# =
1073   case (unsafePerformIO (_ccall_ stg_negateInt64 a#)) of
1074     I64# i# -> i#
1075
1076 and64# :: Word64# -> Word64# -> Word64#
1077 and64# a# b# =
1078   case (unsafePerformIO (_ccall_ stg_and64 a# b#)) of
1079     W64# w# -> w#
1080
1081 or64# :: Word64# -> Word64# -> Word64#
1082 or64# a# b# =
1083   case (unsafePerformIO (_ccall_ stg_or64 a# b#)) of
1084     W64# w# -> w#
1085
1086 xor64# :: Word64# -> Word64# -> Word64#
1087 xor64# a# b# = 
1088   case (unsafePerformIO (_ccall_ stg_xor64 a# b#)) of
1089     W64# w# -> w#
1090
1091 not64# :: Word64# -> Word64#
1092 not64# a# = 
1093   case (unsafePerformIO (_ccall_ stg_not64 a#)) of
1094     W64# w# -> w#
1095
1096 shiftL64# :: Word64# -> Int# -> Word64#
1097 shiftL64# a# b# =
1098   case (unsafePerformIO (_ccall_ stg_shiftL64 a# b#)) of
1099     W64# w# -> w#
1100
1101 shiftRL64# :: Word64# -> Int# -> Word64#
1102 shiftRL64# a# b# =
1103   case (unsafePerformIO (_ccall_ stg_shiftRL64 a# b#)) of
1104     W64# w# -> w#
1105
1106 word64ToWord# :: Word64# -> Word#
1107 word64ToWord# w64# =
1108   case (unsafePerformIO (_ccall_ stg_word64ToWord w64#)) of
1109     W# w# -> w#
1110       
1111 wordToWord64# :: Word# -> Word64#
1112 wordToWord64# w# =
1113   case (unsafePerformIO (_ccall_ stg_wordToWord64 w#)) of
1114     W64# w64# -> w64#
1115
1116 word64ToInt64# :: Word64# -> Int64#
1117 word64ToInt64# w64# =
1118   case (unsafePerformIO (_ccall_ stg_word64ToInt64 w64#)) of
1119     I64# i# -> i#
1120
1121 int64ToWord64# :: Int64# -> Word64#
1122 int64ToWord64# i64# =
1123   case (unsafePerformIO (_ccall_ stg_int64ToWord64 i64#)) of
1124     W64# w# -> w#
1125
1126 intToInt64# :: Int# -> Int64#
1127 intToInt64# i# =
1128   case (unsafePerformIO (_ccall_ stg_intToInt64 i#)) of
1129     I64# i64# -> i64#
1130       
1131 #endif
1132
1133 instance Enum Word64 where
1134     succ w          
1135       | w == maxBound = succError "Word64"
1136       | otherwise     = w+1
1137     pred w          
1138       | w == minBound = predError "Word64"
1139       | otherwise     = w-1
1140
1141     toEnum i
1142       | i >= 0    = intToWord64 i
1143       | otherwise 
1144       = toEnumError "Word64" i (minBound::Word64,maxBound::Word64)
1145
1146     fromEnum w
1147       | w <= intToWord64 (maxBound::Int)
1148       = word64ToInt w
1149       | otherwise
1150       = fromEnumError "Word64" w
1151
1152     enumFrom e1        = map integerToWord64 [word64ToInteger e1 .. word64ToInteger maxBound]
1153     enumFromTo e1 e2   = map integerToWord64 [word64ToInteger e1 .. word64ToInteger e2]
1154     enumFromThen e1 e2 = map integerToWord64 [word64ToInteger e1, word64ToInteger e2 .. word64ToInteger last]
1155                        where 
1156                           last :: Word64
1157                           last 
1158                            | e2 < e1   = minBound
1159                            | otherwise = maxBound
1160
1161     enumFromThenTo e1 e2 e3 = map integerToWord64 [word64ToInteger e1, word64ToInteger e2 .. word64ToInteger e3]
1162
1163 instance Show Word64 where
1164   showsPrec p x = showsPrec p (word64ToInteger x)
1165
1166 instance Read Word64 where
1167   readsPrec _ s = [ (integerToWord64 x,r) | (x,r) <- readDec s ]
1168
1169 instance Ix Word64 where
1170     range (m,n)          = [m..n]
1171     index b@(m,_) i
1172            | inRange b i = word64ToInt (i-m)
1173            | otherwise   = indexError i b "Word64"
1174     inRange (m,n) i      = m <= i && i <= n
1175
1176 instance Bounded Word64 where
1177   minBound = 0
1178   maxBound = minBound - 1
1179
1180 instance Real Word64 where
1181   toRational x = toInteger x % 1
1182
1183 sizeofWord64 :: Word32
1184 sizeofWord64 = 8
1185
1186 \end{code}
1187
1188
1189
1190 The Hugs-GHC extension libraries provide functions for going between
1191 Int and the various (un)signed ints. Here we provide the same for
1192 the GHC specific Word type:
1193
1194 \begin{code}
1195 wordToWord8  :: Word -> Word8
1196 wordToWord16 :: Word -> Word16
1197 wordToWord32 :: Word -> Word32
1198
1199 word8ToWord  :: Word8 -> Word
1200 word16ToWord :: Word16 -> Word
1201 word32ToWord :: Word32 -> Word
1202
1203 word8ToWord#   :: Word8 -> Word#
1204 word16ToWord#  :: Word16 -> Word#
1205 word32ToWord#  :: Word32 -> Word#
1206
1207 word8ToWord  (W8# w#)   = W# w#
1208 word8ToWord# (W8# w#)   = w#
1209
1210 wordToWord8 (W# w#)    = W8# (w# `and#` (case (maxBound::Word8) of W8# x# -> x#))
1211 word16ToWord  (W16# w#) = W# w#
1212 word16ToWord# (W16# w#) = w#
1213
1214 wordToWord16 (W# w#)   = W16# (w# `and#` (case (maxBound::Word16) of W16# x# -> x#))
1215 wordToWord32 (W# w#)   = W32# (w# `and#` (case (maxBound::Word32) of W32# x# -> x#))
1216
1217 word32ToWord  (W32# w#) = W# w#
1218 word32ToWord# (W32# w#) = w#
1219
1220 wordToWord64  :: Word -> Word64
1221 wordToWord64 (W# w#) = W64# (wordToWord64# w#)
1222
1223 -- lossy on 32-bit platforms, but provided nontheless.
1224 word64ToWord :: Word64 -> Word
1225 word64ToWord (W64# w#) = W# (word64ToWord# w#)
1226
1227 \end{code}
1228
1229
1230 --End of exported definitions
1231
1232 The remainder of this file consists of definitions which are only
1233 used in the implementation.
1234
1235 \begin{code}
1236 signumReal :: (Ord a, Num a) => a -> a
1237 signumReal x | x == 0    =  0
1238              | x > 0     =  1
1239              | otherwise = -1
1240
1241 \end{code}
1242
1243 NOTE: the index is in units of the size of the type, *not* bytes.
1244
1245 \begin{code}
1246 indexWord8OffAddr  :: Addr -> Int -> Word8
1247 indexWord8OffAddr (A# a#) (I# i#) = intToWord8 (I# (ord# (indexCharOffAddr# a# i#)))
1248
1249 indexWord16OffAddr :: Addr -> Int -> Word16
1250 indexWord16OffAddr a i =
1251 #ifdef WORDS_BIGENDIAN
1252   intToWord16 ( word8ToInt l + (word8ToInt maxBound) * word8ToInt h)
1253 #else
1254   intToWord16 ( word8ToInt h + (word8ToInt maxBound) * word8ToInt l)
1255 #endif
1256  where
1257    byte_idx = i * 2
1258    l = indexWord8OffAddr a byte_idx
1259    h = indexWord8OffAddr a (byte_idx+1)
1260
1261 indexWord32OffAddr :: Addr -> Int -> Word32
1262 indexWord32OffAddr (A# a#) i = wordToWord32 (W# (indexWordOffAddr# a# i'#))
1263  where
1264    -- adjust index to be in Word units, not Word32 ones.
1265   (I# i'#) 
1266 #if WORD_SIZE_IN_BYTES==8
1267    = i `div` 2
1268 #else
1269    = i
1270 #endif
1271
1272 indexWord64OffAddr :: Addr -> Int -> Word64
1273 indexWord64OffAddr (A# a#) (I# i#)
1274 #if WORD_SIZE_IN_BYTES==8
1275  = W64# (indexWordOffAddr# a# i#)
1276 #else
1277  = W64# (indexWord64OffAddr# a# i#)
1278 #endif
1279
1280 #ifndef __PARALLEL_HASKELL__
1281
1282 indexWord8OffForeignObj  :: ForeignObj -> Int -> Word8
1283 indexWord8OffForeignObj (ForeignObj fo#) (I# i#) = intToWord8 (I# (ord# (indexCharOffForeignObj# fo# i#)))
1284
1285 indexWord16OffForeignObj :: ForeignObj -> Int -> Word16
1286 indexWord16OffForeignObj fo i =
1287 #ifdef WORDS_BIGENDIAN
1288   intToWord16 ( word8ToInt l + (word8ToInt maxBound) * word8ToInt h)
1289 #else
1290   intToWord16 ( word8ToInt h + (word8ToInt maxBound) * word8ToInt l)
1291 #endif
1292  where
1293    byte_idx = i * 2
1294    l = indexWord8OffForeignObj fo byte_idx
1295    h = indexWord8OffForeignObj fo (byte_idx+1)
1296
1297 indexWord32OffForeignObj :: ForeignObj -> Int -> Word32
1298 indexWord32OffForeignObj (ForeignObj fo#) i = wordToWord32 (W# (indexWordOffForeignObj# fo# i'#))
1299  where
1300    -- adjust index to be in Word units, not Word32 ones.
1301   (I# i'#) 
1302 #if WORD_SIZE_IN_BYTES==8
1303    = i `div` 2
1304 #else
1305    = i
1306 #endif
1307
1308 indexWord64OffForeignObj :: ForeignObj -> Int -> Word64
1309 indexWord64OffForeignObj (ForeignObj fo#) (I# i#)
1310 #if WORD_SIZE_IN_BYTES==8
1311  = W64# (indexWordOffForeignObj# fo# i#)
1312 #else
1313  = W64# (indexWord64OffForeignObj# fo# i#)
1314 #endif
1315 #endif
1316
1317 \end{code}
1318
1319 Read words out of mutable memory:
1320
1321 \begin{code}
1322 readWord8OffAddr :: Addr -> Int -> IO Word8
1323 readWord8OffAddr a i = _casm_ `` %r=(StgNat8)(((StgNat8*)%0)[(StgInt)%1]); '' a i
1324
1325 readWord16OffAddr  :: Addr -> Int -> IO Word16
1326 readWord16OffAddr a i = _casm_ `` %r=(StgNat16)(((StgNat16*)%0)[(StgInt)%1]); '' a i
1327
1328 readWord32OffAddr  :: Addr -> Int -> IO Word32
1329 readWord32OffAddr a i = _casm_ `` %r=(StgNat32)(((StgNat32*)%0)[(StgInt)%1]); '' a i
1330
1331 readWord64OffAddr  :: Addr -> Int -> IO Word64
1332 #if WORD_SIZE_IN_BYTES==8
1333 readWord64OffAddr a i = _casm_ `` %r=(StgWord)(((StgWord*)%0)[(StgInt)%1]); '' a i
1334 #else
1335 readWord64OffAddr a i = _casm_ `` %r=(StgNat64)(((StgNat64*)%0)[(StgInt)%1]); '' a i
1336 #endif
1337
1338 #ifndef __PARALLEL_HASKELL__
1339 readWord8OffForeignObj :: ForeignObj -> Int -> IO Word8
1340 readWord8OffForeignObj fo i = _casm_ `` %r=(StgNat8)(((StgNat8*)%0)[(StgInt)%1]); '' fo i
1341
1342 readWord16OffForeignObj  :: ForeignObj -> Int -> IO Word16
1343 readWord16OffForeignObj fo i = _casm_ `` %r=(StgNat16)(((StgNat16*)%0)[(StgInt)%1]); '' fo i
1344
1345 readWord32OffForeignObj  :: ForeignObj -> Int -> IO Word32
1346 readWord32OffForeignObj fo i = _casm_ `` %r=(StgNat32)(((StgNat32*)%0)[(StgInt)%1]); '' fo i
1347
1348 readWord64OffForeignObj  :: ForeignObj -> Int -> IO Word64
1349 #if WORD_SIZE_IN_BYTES==8
1350 readWord64OffForeignObj fo i = _casm_ `` %r=(StgWord)(((StgWord*)%0)[(StgInt)%1]); '' fo i
1351 #else
1352 readWord64OffForeignObj fo i = _casm_ `` %r=(StgNat64)(((StgNat64*)%0)[(StgInt)%1]); '' fo i
1353 #endif
1354
1355 #endif 
1356
1357 \end{code}
1358
1359 Note: we provide primops for the writing via Addrs since that's used
1360 in the IO implementation (a place where we *really* do care about cycles.)
1361
1362 \begin{code}
1363 writeWord8OffAddr  :: Addr -> Int -> Word8  -> IO ()
1364 writeWord8OffAddr (A# a#) (I# i#) (W8# w#) = IO $ \ s# ->
1365       case (writeCharOffAddr# a# i# (chr# (word2Int# w#)) s#) of s2# -> (# s2#, () #)
1366
1367 writeWord16OffAddr :: Addr -> Int -> Word16 -> IO ()
1368 writeWord16OffAddr a i e = _casm_ `` (((StgNat16*)%0)[(StgInt)%1])=(StgNat16)%2; '' a i e
1369
1370 writeWord32OffAddr :: Addr -> Int -> Word32 -> IO ()
1371 writeWord32OffAddr (A# a#) i (W32# w#) = IO $ \ s# ->
1372       case (writeWordOffAddr#  a# i'# w# s#) of s2# -> (# s2#, () #)
1373  where
1374    -- adjust index to be in Word units, not Word32 ones.
1375   (I# i'#) 
1376 #if WORD_SIZE_IN_BYTES==8
1377    = i `div` 2
1378 #else
1379    = i
1380 #endif
1381
1382 writeWord64OffAddr :: Addr -> Int -> Word64 -> IO ()
1383 #if WORD_SIZE_IN_BYTES==8
1384 writeWord64OffAddr (A# a#) (I# i#) (W64# w#) = IO $ \ s# ->
1385       case (writeWordOffAddr#  a# i# w# s#) of s2# -> (# s2#, () #)
1386 #else
1387 writeWord64OffAddr (A# a#) (I# i#) (W64# w#) = IO $ \ s# ->
1388       case (writeWord64OffAddr#  a# i# w# s#) of s2# -> (# s2#, () #)
1389 #endif
1390
1391 #ifndef __PARALLEL_HASKELL__
1392
1393 writeWord8OffForeignObj  :: ForeignObj -> Int -> Word8  -> IO ()
1394 writeWord8OffForeignObj fo i w = _casm_ `` (((StgNat16*)%0)[(StgInt)%1])=(StgNat16)%2; '' fo i w
1395
1396 writeWord16OffForeignObj :: ForeignObj -> Int -> Word16 -> IO ()
1397 writeWord16OffForeignObj fo i w = _casm_ `` (((StgNat16*)%0)[(StgInt)%1])=(StgNat16)%2; '' fo i w
1398
1399 writeWord32OffForeignObj :: ForeignObj -> Int -> Word32 -> IO ()
1400 writeWord32OffForeignObj fo i w = _casm_ `` (((StgNat16*)%0)[(StgInt)%1])=(StgNat16)%2; '' fo i' w
1401  where
1402    -- adjust index to be in Word units, not Word32 ones.
1403   i' 
1404 #if WORD_SIZE_IN_BYTES==8
1405    = i `div` 2
1406 #else
1407    = i
1408 #endif
1409
1410 writeWord64OffForeignObj :: ForeignObj -> Int -> Word64 -> IO ()
1411 # if WORD_SIZE_IN_BYTES==8
1412 writeWord64OffForeignObj fo i e = _casm_ `` (((StgWord*)%0)[(StgInt)%1])=(StgWord)%2; '' fo i e
1413 # else
1414 writeWord64OffForeignObj fo i e = _casm_ `` (((StgNat64*)%0)[(StgInt)%1])=(StgNat64)%2; '' fo i e
1415 # endif
1416
1417 #endif
1418
1419 \end{code}
1420
1421 Utils for generating friendly error messages.
1422
1423 \begin{code}
1424 {-# NOINLINE indexError #-}
1425 indexError :: (Show a) => a -> (a,a) -> String -> b
1426 indexError i rng tp
1427   = error (showString "Ix{" . showString tp . showString "}.index: Index " .
1428            showParen True (showsPrec 0 i) .
1429            showString " out of range " $
1430            showParen True (showsPrec 0 rng) "")
1431
1432 toEnumError :: (Show a,Show b) => String -> a -> (b,b) -> c
1433 toEnumError inst_ty tag bnds
1434   = error ("Enum.toEnum{" ++ inst_ty ++ "}: tag " ++
1435            (showParen True (showsPrec 0 tag) $
1436              " is outside of bounds " ++
1437              show bnds))
1438
1439 fromEnumError :: (Show a,Show b) => String -> a -> b
1440 fromEnumError inst_ty tag
1441   = error ("Enum.fromEnum{" ++ inst_ty ++ "}: value " ++
1442            (showParen True (showsPrec 0 tag) $
1443              " is outside of Int's bounds " ++
1444              show (minBound::Int,maxBound::Int)))
1445
1446 succError :: String -> a
1447 succError inst_ty
1448   = error ("Enum.succ{" ++ inst_ty ++ "}: tried to take `succ' of maxBound")
1449
1450 predError :: String -> a
1451 predError inst_ty
1452   = error ("Enum.pred{" ++ inst_ty ++ "}: tried to take `pred' of minBound")
1453
1454 divZeroError :: (Show a) => String -> a -> b
1455 divZeroError meth v 
1456   = error ("Integral." ++ meth ++ ": divide by 0 (" ++ show v ++ " / 0)")
1457
1458 \end{code}