[project @ 2001-01-12 12:35:54 by simonmar]
[ghc-hetmet.git] / ghc / lib / std / PrelInt.lhs
1 %
2 % (c) The University of Glasgow, 2000
3 %
4 \section[PrelInt]{Module @PrelInt@}
5
6 \begin{code}
7 {-# OPTIONS -monly-3-regs #-}
8
9 module PrelInt 
10    ( 
11         Int8(..), Int16(..), Int32(..), Int64(..)
12
13         , intToInt8      -- :: Int     -> Int8
14         , intToInt16     -- :: Int     -> Int16
15         , intToInt32     -- :: Int     -> Int32
16         , intToInt64     -- :: Int     -> Int64
17
18         , integerToInt8  -- :: Integer -> Int8
19         , integerToInt16 -- :: Integer -> Int16
20         , integerToInt32 -- :: Integer -> Int32
21         , integerToInt64 -- :: Integer -> Int64
22
23         , int8ToInt      -- :: Int8    -> Int
24         , int8ToInteger  -- :: Int8    -> Integer
25         , int8ToInt16    -- :: Int8    -> Int16
26         , int8ToInt32    -- :: Int8    -> Int32
27         , int8ToInt64    -- :: Int8    -> Int64
28
29         , int16ToInt     -- :: Int16   -> Int
30         , int16ToInteger -- :: Int16   -> Integer
31         , int16ToInt8    -- :: Int16   -> Int8
32         , int16ToInt32   -- :: Int16   -> Int32
33         , int16ToInt64   -- :: Int16   -> Int64
34
35         , int32ToInt     -- :: Int32   -> Int
36         , int32ToInteger -- :: Int32   -> Integer
37         , int32ToInt8    -- :: Int32   -> Int8
38         , int32ToInt16   -- :: Int32   -> Int16
39         , int32ToInt64   -- :: Int32   -> Int64
40
41         , int64ToInt     -- :: Int64   -> Int
42         , int64ToInteger -- :: Int64   -> Integer
43         , int64ToInt8    -- :: Int64   -> Int8
44         , int64ToInt16   -- :: Int64   -> Int16
45         , int64ToInt32   -- :: Int64   -> Int32
46
47         -- internal stuff
48         , intToInt8#, i8ToInt#, intToInt16#, i16ToInt#, intToInt32#, i32ToInt#,
49         , intToInt64#, plusInt64#, minusInt64#, negateInt64#
50
51  ) where
52
53 import PrelWord
54 import PrelBits
55 import PrelArr
56 import PrelRead
57 import PrelReal
58 import PrelNum
59 import PrelBase
60
61 -- ---------------------------------------------------------------------------
62 -- Coercion functions (DEPRECATED)
63 -- ---------------------------------------------------------------------------
64
65 intToInt8      :: Int     -> Int8
66 intToInt16     :: Int     -> Int16
67 intToInt32     :: Int     -> Int32
68 intToInt64     :: Int     -> Int64
69
70 integerToInt8  :: Integer -> Int8
71 integerToInt16 :: Integer -> Int16
72 integerToInt32 :: Integer -> Int32
73 integerToInt64 :: Integer -> Int64
74
75 int8ToInt      :: Int8    -> Int
76 int8ToInteger  :: Int8    -> Integer
77 int8ToInt16    :: Int8    -> Int16
78 int8ToInt32    :: Int8    -> Int32
79 int8ToInt64    :: Int8    -> Int64
80
81 int16ToInt     :: Int16   -> Int
82 int16ToInteger :: Int16   -> Integer
83 int16ToInt8    :: Int16   -> Int8
84 int16ToInt32   :: Int16   -> Int32
85 int16ToInt64   :: Int16   -> Int64
86
87 int32ToInt     :: Int32   -> Int
88 int32ToInteger :: Int32   -> Integer
89 int32ToInt8    :: Int32   -> Int8
90 int32ToInt16   :: Int32   -> Int16
91 int32ToInt64   :: Int32   -> Int64
92
93 int64ToInt     :: Int64   -> Int
94 int64ToInteger :: Int64   -> Integer
95 int64ToInt8    :: Int64   -> Int8
96 int64ToInt16   :: Int64   -> Int16
97 int64ToInt32   :: Int64   -> Int32
98
99 integerToInt8  = fromInteger
100 integerToInt16 = fromInteger
101 integerToInt32 = fromInteger
102
103 int8ToInt16    = intToInt16 . int8ToInt
104 int8ToInt32    = intToInt32 . int8ToInt
105 int16ToInt32   = intToInt32 . int16ToInt
106
107 int16ToInt8  (I16# x) = I8#  (intToInt8# x)
108 int32ToInt8  (I32# x) = I8#  (intToInt8# x)
109 int32ToInt16 (I32# x) = I16# (intToInt16# x)
110
111 int8ToInteger  = toInteger
112 int8ToInt64    = int32ToInt64 . int8ToInt32
113
114 int16ToInteger = toInteger
115 int16ToInt64   = int32ToInt64 . int16ToInt32
116
117 int32ToInteger = toInteger
118
119 int64ToInt8    = int32ToInt8  . int64ToInt32
120 int64ToInt16   = int32ToInt16 . int64ToInt32
121
122 -----------------------------------------------------------------------------
123 -- The following rules for fromIntegral remove the need to export specialized
124 -- conversion functions.
125 -----------------------------------------------------------------------------
126
127 {-# RULES
128    "fromIntegral/Int->Int8"         fromIntegral = intToInt8;
129    "fromIntegral/Int->Int16"        fromIntegral = intToInt16;
130    "fromIntegral/Int->Int32"        fromIntegral = intToInt32;
131    "fromIntegral/Int->Int64"        fromIntegral = intToInt64;
132
133    "fromIntegral/Integer->Int8"     fromIntegral = integerToInt8;
134    "fromIntegral/Integer->Int16"    fromIntegral = integerToInt16;
135    "fromIntegral/Integer->Int32"    fromIntegral = integerToInt32;
136    "fromIntegral/Integer->Int64"    fromIntegral = integerToInt64;
137
138    "fromIntegral/Int8->Int"         fromIntegral = int8ToInt;
139    "fromIntegral/Int8->Integer"     fromIntegral = int8ToInteger;
140    "fromIntegral/Int8->Int16"       fromIntegral = int8ToInt16;
141    "fromIntegral/Int8->Int32"       fromIntegral = int8ToInt32;
142    "fromIntegral/Int8->Int64"       fromIntegral = int8ToInt64;
143
144    "fromIntegral/Int16->Int"        fromIntegral = int16ToInt;
145    "fromIntegral/Int16->Integer"    fromIntegral = int16ToInteger;
146    "fromIntegral/Int16->Int8"       fromIntegral = int16ToInt8;
147    "fromIntegral/Int16->Int32"      fromIntegral = int16ToInt32;
148    "fromIntegral/Int16->Int64"      fromIntegral = int16ToInt64;
149
150    "fromIntegral/Int32->Int"        fromIntegral = int32ToInt;
151    "fromIntegral/Int32->Integer"    fromIntegral = int32ToInteger;
152    "fromIntegral/Int32->Int8"       fromIntegral = int32ToInt8;
153    "fromIntegral/Int32->Int16"      fromIntegral = int32ToInt16;
154    "fromIntegral/Int32->Int64"      fromIntegral = int32ToInt64;
155
156    "fromIntegral/Int64->Int"        fromIntegral = int64ToInt;
157    "fromIntegral/Int64->Integer"    fromIntegral = int64ToInteger;
158    "fromIntegral/Int64->Int8"       fromIntegral = int64ToInt8;
159    "fromIntegral/Int64->Int16"      fromIntegral = int64ToInt16;
160    "fromIntegral/Int64->Int32"      fromIntegral = int64ToInt32
161  #-}
162
163 -- -----------------------------------------------------------------------------
164 -- Int8
165 -- -----------------------------------------------------------------------------
166
167 data Int8 = I8# Int#
168
169 instance CCallable Int8
170 instance CReturnable Int8
171
172 int8ToInt (I8# x)  = I# (i8ToInt# x)
173
174 i8ToInt# :: Int# -> Int#
175 i8ToInt# x = if x' <=# 0x7f# then x' else x' -# 0x100#
176    where x' = word2Int# (int2Word# x `and#` int2Word# 0xff#)
177
178 -- This doesn't perform any bounds checking on the value it is passed,
179 -- nor its sign, i.e., show (intToInt8 511) => "-1"
180 intToInt8 (I# x) = I8# (intToInt8# x)
181
182 intToInt8# :: Int# -> Int#
183 intToInt8# i# = word2Int# ((int2Word# i#) `and#` int2Word# 0xff#)
184
185 instance Eq  Int8     where 
186   (I8# x#) == (I8# y#) = x# ==# y#
187   (I8# x#) /= (I8# y#) = x# /=# y#
188
189 instance Ord Int8 where 
190   compare (I8# x#) (I8# y#) = compareInt# (i8ToInt# x#) (i8ToInt# y#)
191
192 compareInt# :: Int# -> Int# -> Ordering
193 compareInt# x# y#
194  | x# <#  y# = LT
195  | x# ==# y# = EQ
196  | otherwise = GT
197
198 instance Num Int8 where
199   (I8# x#) + (I8# y#) = I8# (intToInt8# (x# +# y#))
200   (I8# x#) - (I8# y#) = I8# (intToInt8# (x# -# y#))
201   (I8# x#) * (I8# y#) = I8# (intToInt8# (x# *# y#))
202   negate i@(I8# x#) = 
203      if x# ==# 0#
204       then i
205       else I8# (0x100# -# x#)
206
207   abs           = absReal
208   signum        = signumReal
209   fromInteger (S# i#)    = I8# (intToInt8# i#)
210   fromInteger (J# s# d#) = I8# (intToInt8# (integer2Int# s# d#))
211   fromInt       = intToInt8
212
213 instance Bounded Int8 where
214     minBound = 0x80
215     maxBound = 0x7f 
216
217 instance Real Int8 where
218     toRational x = toInteger x % 1
219
220 instance Integral Int8 where
221     div x y
222        | x > 0 && y < 0 = quotInt8 (x-y-1) y
223        | x < 0 && y > 0 = quotInt8 (x-y+1) y
224        | otherwise      = quotInt8 x y
225     quot x@(I8# _) y@(I8# y#)
226        | y# /=# 0# = x `quotInt8` y
227        | otherwise = divZeroError "quot{Int8}" x
228     rem x@(I8# _) y@(I8# y#)
229        | y# /=# 0#  = x `remInt8` y
230        | otherwise  = divZeroError "rem{Int8}" x
231     mod x y
232        | x > 0 && y < 0 || x < 0 && y > 0 = if r/=0 then r+y else 0
233        | otherwise = r
234         where r = remInt8 x y
235
236     a@(I8# _) `quotRem` b@(I8# _) = (a `quotInt8` b, a `remInt8` b)
237     toInteger i8  = toInteger (int8ToInt i8)
238     toInt     i8  = int8ToInt i8
239
240
241 remInt8, quotInt8 :: Int8 -> Int8 -> Int8
242 remInt8  (I8# x) (I8# y) = I8# (intToInt8# ((i8ToInt# x) `remInt#`  (i8ToInt# y)))
243 quotInt8 (I8# x) (I8# y) = I8# (intToInt8# ((i8ToInt# x) `quotInt#` (i8ToInt# y)))
244
245 instance Ix Int8 where
246     range (m,n)          = [m..n]
247     index b@(m,_) i
248               | inRange b i = int8ToInt (i - m)
249               | otherwise   = indexError b i "Int8"
250     inRange (m,n) i      = m <= i && i <= n
251
252 instance Enum Int8 where
253     succ i
254       | i == maxBound = succError "Int8"
255       | otherwise     = i+1
256     pred i
257       | i == minBound = predError "Int8"
258       | otherwise     = i-1
259
260     toEnum x
261       | x >= toInt (minBound::Int8) && x <= toInt (maxBound::Int8) 
262       = intToInt8 x
263       | otherwise
264       = toEnumError "Int8" x (minBound::Int8,maxBound::Int8)
265
266     fromEnum           = int8ToInt
267     enumFrom e1        = map toEnum [fromEnum e1 .. fromEnum (maxBound::Int8)]
268     enumFromThen e1 e2 = 
269              map toEnum [fromEnum e1, fromEnum e2 .. fromEnum (last::Int8)]
270                 where 
271                    last 
272                      | e2 < e1   = minBound
273                      | otherwise = maxBound
274
275 instance Read Int8 where
276     readsPrec p s = [ (intToInt8 x,r) | (x,r) <- readsPrec p s ]
277
278 instance Show Int8 where
279     showsPrec p i8 = showsPrec p (int8ToInt i8)
280
281 binop8 :: (Int32 -> Int32 -> a) -> (Int8 -> Int8 -> a)
282 binop8 op x y = int8ToInt32 x `op` int8ToInt32 y
283
284 instance Bits Int8 where
285   (I8# x) .&. (I8# y) = I8# (word2Int# ((int2Word# x) `and#` (int2Word# y)))
286   (I8# x) .|. (I8# y) = I8# (word2Int# ((int2Word# x) `or#`  (int2Word# y)))
287   (I8# x) `xor` (I8# y) = I8# (word2Int# ((int2Word# x) `xor#` (int2Word# y)))
288   complement (I8# x)    = I8# (word2Int# ((int2Word# x) `xor#` (int2Word# 0xff#)))
289   shift (I8# x) i@(I# i#)
290         | i > 0     = I8# (intToInt8# (iShiftL# (i8ToInt# x)  i#))
291         | otherwise = I8# (intToInt8# (iShiftRA# (i8ToInt# x) (negateInt# i#)))
292   i8@(I8# x)  `rotate` (I# i)
293         | i ==# 0#    = i8
294         | i ># 0#     = 
295              I8# (intToInt8# ( word2Int#  (
296                      (int2Word# (iShiftL# (i8ToInt# x) i'))
297                              `or#`
298                      (int2Word# (iShiftRA# (word2Int# (
299                                                 (int2Word# x) `and#` 
300                                                 (int2Word# (0x100# -# pow2# i2))))
301                                           i2)))))
302         | otherwise = rotate i8 (I# (8# +# i))
303           where
304            i' = word2Int# (int2Word# i `and#` int2Word# 7#)
305            i2 = 8# -# i'
306   bitSize  _    = 8
307   isSigned _    = True
308
309 pow2# :: Int# -> Int#
310 pow2# x# = iShiftL# 1# x#
311
312 pow2_64# :: Int# -> Int64#
313 pow2_64# x# = word64ToInt64# (shiftL64# (wordToWord64# (int2Word# 1#)) x#)
314
315 -- -----------------------------------------------------------------------------
316 -- Int16
317 -- -----------------------------------------------------------------------------
318
319 data Int16  = I16# Int#
320
321 instance CCallable Int16
322 instance CReturnable Int16
323
324 int16ToInt  (I16# x) = I# (i16ToInt# x)
325
326 i16ToInt# :: Int# -> Int#
327 i16ToInt# x = if x' <=# 0x7fff# then x' else x' -# 0x10000#
328    where x' = word2Int# (int2Word# x `and#` int2Word# 0xffff#)
329
330 -- This doesn't perform any bounds checking on the value it is passed,
331 -- nor its sign, i.e., show (intToInt8 131071) => "-1"
332 intToInt16 (I# x) = I16# (intToInt16# x)
333
334 intToInt16# :: Int# -> Int#
335 intToInt16# i# = word2Int# ((int2Word# i#) `and#` int2Word# 0xffff#)
336
337 instance Eq  Int16     where
338   (I16# x#) == (I16# y#) = x# ==# y#
339   (I16# x#) /= (I16# y#) = x# /=# y#
340
341 instance Ord Int16 where
342   compare (I16# x#) (I16# y#) = compareInt# (i16ToInt# x#) (i16ToInt# y#)
343
344 instance Num Int16 where
345   (I16# x#) + (I16# y#) = I16# (intToInt16# (x# +# y#))
346   (I16# x#) - (I16# y#) = I16# (intToInt16# (x# -# y#))
347   (I16# x#) * (I16# y#) = I16# (intToInt16# (x# *# y#))
348   negate i@(I16# x#) = 
349      if x# ==# 0#
350       then i
351       else I16# (0x10000# -# x#)
352   abs           = absReal
353   signum        = signumReal
354   fromInteger (S# i#)    = I16# (intToInt16# i#)
355   fromInteger (J# s# d#) = I16# (intToInt16# (integer2Int# s# d#))
356   fromInt       = intToInt16
357
358 instance Bounded Int16 where
359     minBound = 0x8000
360     maxBound = 0x7fff 
361
362 instance Real Int16 where
363     toRational x = toInteger x % 1
364
365 instance Integral Int16 where
366     div x y
367        | x > 0 && y < 0 = quotInt16 (x-y-1) y
368        | x < 0 && y > 0 = quotInt16 (x-y+1) y
369        | otherwise      = quotInt16 x y
370     quot x@(I16# _) y@(I16# y#)
371        | y# /=# 0#      = x `quotInt16` y
372        | otherwise      = divZeroError "quot{Int16}" x
373     rem x@(I16# _) y@(I16# y#)
374        | y# /=# 0#      = x `remInt16` y
375        | otherwise      = divZeroError "rem{Int16}" x
376     mod x y
377        | x > 0 && y < 0 || x < 0 && y > 0 = if r/=0 then r+y else 0
378        | otherwise                        = r
379         where r = remInt16 x y
380
381     a@(I16# _) `quotRem` b@(I16# _) = (a `quotInt16` b, a `remInt16` b)
382     toInteger i16  = toInteger (int16ToInt i16)
383     toInt     i16  = int16ToInt i16
384
385 remInt16, quotInt16 :: Int16 -> Int16 -> Int16
386 remInt16  (I16# x) (I16# y) = I16# (intToInt16# ((i16ToInt# x) `remInt#` (i16ToInt# y)))
387 quotInt16 (I16# x) (I16# y) = I16# (intToInt16# ((i16ToInt# x) `quotInt#` (i16ToInt# y)))
388
389 instance Ix Int16 where
390     range (m,n)          = [m..n]
391     index b@(m,_) i
392               | inRange b i = int16ToInt (i - m)
393               | otherwise   = indexError b i "Int16"
394     inRange (m,n) i      = m <= i && i <= n
395
396 instance Enum Int16 where
397     succ i
398       | i == maxBound = succError "Int16"
399       | otherwise     = i+1
400
401     pred i
402       | i == minBound = predError "Int16"
403       | otherwise     = i-1
404
405     toEnum x
406       | x >= toInt (minBound::Int16) && x <= toInt (maxBound::Int16) 
407       = intToInt16 x
408       | otherwise
409       = toEnumError "Int16" x (minBound::Int16, maxBound::Int16)
410
411     fromEnum         = int16ToInt
412
413     enumFrom e1        = map toEnum [fromEnum e1 .. fromEnum (maxBound::Int16)]
414     enumFromThen e1 e2 = map toEnum [fromEnum e1, fromEnum e2 .. fromEnum (last::Int16)]
415                           where last 
416                                   | e2 < e1   = minBound
417                                   | otherwise = maxBound
418
419 instance Read Int16 where
420     readsPrec p s = [ (intToInt16 x,r) | (x,r) <- readsPrec p s ]
421
422 instance Show Int16 where
423     showsPrec p i16 = showsPrec p (int16ToInt i16)
424
425
426 binop16 :: (Int32 -> Int32 -> a) -> (Int16 -> Int16 -> a)
427 binop16 op x y = int16ToInt32 x `op` int16ToInt32 y
428
429 instance Bits Int16 where
430   (I16# x) .&. (I16# y) = I16# (word2Int# ((int2Word# x) `and#` (int2Word# y)))
431   (I16# x) .|. (I16# y) = I16# (word2Int# ((int2Word# x) `or#`  (int2Word# y)))
432   (I16# x) `xor` (I16# y) = I16# (word2Int# ((int2Word# x) `xor#`  (int2Word# y)))
433   complement (I16# x)    = I16# (word2Int# ((int2Word# x) `xor#` (int2Word# 0xffff#)))
434   shift (I16# x) i@(I# i#)
435         | i > 0     = I16# (intToInt16# (iShiftL# (i16ToInt# x)  i#))
436         | otherwise = I16# (intToInt16# (iShiftRA# (i16ToInt# x) (negateInt# i#)))
437   i16@(I16# x)  `rotate` (I# i)
438         | i ==# 0#    = i16
439         | i ># 0#     = 
440              I16# (intToInt16# (word2Int# (
441                     (int2Word# (iShiftL# (i16ToInt# x) i')) 
442                              `or#`
443                     (int2Word# (iShiftRA# ( word2Int# (
444                                     (int2Word# x) `and#` (int2Word# (0x100# -# pow2# i2))))
445                                           i2)))))
446         | otherwise = rotate i16 (I# (16# +# i))
447           where
448            i' = word2Int# (int2Word# i `and#` int2Word# 15#)
449            i2 = 16# -# i'
450   bitSize  _        = 16
451   isSigned _        = True
452
453 -- -----------------------------------------------------------------------------
454 -- Int32
455 -- -----------------------------------------------------------------------------
456
457 data Int32  = I32# Int#
458
459 instance CCallable Int32
460 instance CReturnable Int32
461
462 int32ToInt  (I32# x) = I# (i32ToInt# x)
463
464 i32ToInt# :: Int# -> Int#
465 #if WORD_SIZE_IN_BYTES > 4
466 i32ToInt# x = if x' <=# 0x7fffffff# then x' else x' -# 0x100000000#
467    where x' = word2Int# (int2Word# x `and#` int2Word# 0xffffffff#)
468 #else
469 i32ToInt# x = x
470 #endif
471
472 intToInt32 (I# x) = I32# (intToInt32# x)
473
474 intToInt32# :: Int# -> Int#
475 #if WORD_SIZE_IN_BYTES > 4
476 intToInt32# i# = word2Int# ((int2Word# i#) `and#` int2Word# 0xffffffff#)
477 #else
478 intToInt32# i# = i#
479 #endif
480
481 instance Eq  Int32     where
482   (I32# x#) == (I32# y#) = x# ==# y#
483   (I32# x#) /= (I32# y#) = x# /=# y#
484
485 instance Ord Int32    where
486   compare (I32# x#) (I32# y#) = compareInt# (i32ToInt# x#) (i32ToInt# y#)
487
488 instance Num Int32 where
489   (I32# x#) + (I32# y#) = I32# (intToInt32# (x# +# y#))
490   (I32# x#) - (I32# y#) = I32# (intToInt32# (x# -# y#))
491   (I32# x#) * (I32# y#) = I32# (intToInt32# (x# *# y#))
492 #if WORD_SIZE_IN_BYTES > 4
493   negate i@(I32# x)  = 
494       if x ==# 0#
495        then i
496        else I32# (intToInt32# (0x100000000# -# x'))
497 #else
498   negate (I32# x)  = I32# (negateInt# x)
499 #endif
500   abs           = absReal
501   signum        = signumReal
502   fromInteger (S# i#)    = I32# (intToInt32# i#)
503   fromInteger (J# s# d#) = I32# (intToInt32# (integer2Int# s# d#))
504   fromInt       = intToInt32
505
506
507 instance Bounded Int32 where 
508     minBound = fromInt minBound
509     maxBound = fromInt maxBound
510
511 instance Real Int32 where
512     toRational x = toInteger x % 1
513
514 instance Integral Int32 where
515     div x y
516        | x > 0 && y < 0 = quotInt32 (x-y-1) y
517        | x < 0 && y > 0 = quotInt32 (x-y+1) y
518        | otherwise      = quotInt32 x y
519     quot x@(I32# _) y@(I32# y#)
520        | y# /=# 0#  = x `quotInt32` y
521        | otherwise  = divZeroError "quot{Int32}" x
522     rem x@(I32# _) y@(I32# y#)
523        | y# /=# 0#  = x `remInt32` y
524        | otherwise  = divZeroError "rem{Int32}" x
525     mod x y
526        | x > 0 && y < 0 || x < 0 && y > 0 = if r/=0 then r+y else 0
527        | otherwise                        = r
528         where r = remInt32 x y
529
530     a@(I32# _) `quotRem` b@(I32# _) = (a `quotInt32` b, a `remInt32` b)
531     toInteger i32  = toInteger (int32ToInt i32)
532     toInt     i32  = int32ToInt i32
533
534 remInt32, quotInt32 :: Int32 -> Int32 -> Int32
535 remInt32  (I32# x) (I32# y) = I32# (intToInt32# ((i32ToInt# x) `remInt#`  (i32ToInt# y)))
536 quotInt32 (I32# x) (I32# y) = I32# (intToInt32# ((i32ToInt# x) `quotInt#` (i32ToInt# y)))
537
538 instance Ix Int32 where
539     range (m,n)          = [m..n]
540     index b@(m,_) i
541               | inRange b i = int32ToInt (i - m)
542               | otherwise   = indexError b i "Int32"
543     inRange (m,n) i      = m <= i && i <= n
544
545 instance Enum Int32 where
546     succ i
547       | i == maxBound = succError "Int32"
548       | otherwise     = i+1
549
550     pred i
551       | i == minBound = predError "Int32"
552       | otherwise     = i-1
553
554     toEnum x
555         -- with Int having the same range as Int32, the following test
556         -- shouldn't fail. However, having it here 
557       | x >= toInt (minBound::Int32) && x <= toInt (maxBound::Int32) 
558       = intToInt32 x
559       | otherwise
560       = toEnumError "Int32" x (minBound::Int32, maxBound::Int32)
561
562     fromEnum           = int32ToInt
563
564     enumFrom e1        = map toEnum [fromEnum e1 .. fromEnum (maxBound::Int32)]
565     enumFromThen e1 e2 = map toEnum [fromEnum e1, fromEnum e2 .. fromEnum (last::Int32)]
566                           where 
567                             last
568                              | e2 < e1   = minBound
569                              | otherwise = maxBound
570
571
572 instance Read Int32 where
573     readsPrec p s = [ (intToInt32 x,r) | (x,r) <- readsPrec p s ]
574
575 instance Show Int32 where
576     showsPrec p i32 = showsPrec p (int32ToInt i32)
577
578 instance Bits Int32 where
579   (I32# x) .&. (I32# y)   = I32# (word2Int# ((int2Word# x) `and#` (int2Word# y)))
580   (I32# x) .|. (I32# y)   = I32# (word2Int# ((int2Word# x) `or#`  (int2Word# y)))
581   (I32# x) `xor` (I32# y) = I32# (word2Int# ((int2Word# x) `xor#` (int2Word# y)))
582 #if WORD_SIZE_IN_BYTES > 4
583   complement (I32# x)     = I32# (word2Int# ((int2Word# x) `xor#` (int2Word# 0xffffffff#)))
584 #else
585   complement (I32# x)     = I32# (word2Int# ((int2Word# x) `xor#` (int2Word# (negateInt# 1#))))
586 #endif
587   shift (I32# x) i@(I# i#)
588         | i > 0     = I32# (intToInt32# (iShiftL# (i32ToInt# x)  i#))
589         | otherwise = I32# (intToInt32# (iShiftRA# (i32ToInt# x) (negateInt# i#)))
590   i32@(I32# x)  `rotate` (I# i)
591         | i ==# 0#    = i32
592         | i ># 0#     = 
593              -- ( (x<<i') | ((x&(0x100000000-2^i2))>>i2)
594              I32# (intToInt32# ( word2Int# (
595                     (int2Word# (iShiftL# (i32ToInt# x) i')) 
596                           `or#`
597                     (int2Word# (iShiftRA# (word2Int# (
598                                               (int2Word# x) 
599                                                   `and#` 
600                                                (int2Word# (maxBound# -# pow2# i2 +# 1#))))
601                                           i2)))))
602         | otherwise = rotate i32 (I# (32# +# i))
603           where
604            i' = word2Int# (int2Word# i `and#` int2Word# 31#)
605            i2 = 32# -# i'
606            (I32# maxBound#) = maxBound
607   bitSize  _    = 32
608   isSigned _    = True
609
610 -- -----------------------------------------------------------------------------
611 -- Int64
612 -- -----------------------------------------------------------------------------
613
614 #if WORD_SIZE_IN_BYTES == 8
615 data Int64  = I64# Int#
616
617 int32ToInt64 (I32# i#) = I64# i#
618
619 intToInt32# :: Int# -> Int#
620 intToInt32# i# = word2Int# ((int2Word# i#) `and#` (case (maxBound::Word32) of W# x# -> x#))
621
622 int64ToInt32 (I64# i#) = I32# (intToInt32# w#)
623
624 instance Eq  Int64     where 
625   (I64# x) == (I64# y) = x `eqInt#` y
626   (I64# x) /= (I64# y) = x `neInt#` y
627
628 instance Ord Int32    where
629   compare (I64# x#) (I64# y#) = compareInt# x# y#
630
631 instance Num Int64 where
632   (I64# x) + (I64# y) = I64# (x +# y)
633   (I64# x) - (I64# y) = I64# (x -# y)
634   (I64# x) * (I64# y) = I64# (x *# y)
635   negate w@(I64# x)   = I64# (negateInt# x)
636   abs x               = absReal
637   signum              = signumReal
638   fromInteger (S# i#)    = I64# i#
639   fromInteger (J# s# d#) = I64# (integer2Int# s# d#)
640   fromInt       = intToInt64
641
642 instance Bounded Int64 where
643   minBound = integerToInt64 (-0x8000000000000000)
644   maxBound = integerToInt64 0x7fffffffffffffff
645
646 instance Integral Int64 where
647     div x y
648       | x > 0 && y < 0  = quotInt64 (x-y-1) y
649       | x < 0 && y > 0  = quotInt64 (x-y+1) y
650       | otherwise       = quotInt64 x y
651
652     quot x@(I64# _) y@(I64# y#)
653        | y# /=# 0# = x `quotInt64` y
654        | otherwise = divZeroError "quot{Int64}" x
655
656     rem x@(I64# _) y@(I64# y#)
657        | y# /=# 0# = x `remInt64` y
658        | otherwise = divZeroError "rem{Int64}" x
659
660     mod x y
661        | x > 0 && y < 0 || x < 0 && y > 0 = if r/=0 then r+y else 0
662        | otherwise = r
663         where r = remInt64 x y
664
665     a@(I64# _) `quotRem` b@(I64# _) = (a `quotInt64` b, a `remInt64` b)
666     toInteger (I64# i#) = toInteger (I# i#)
667     toInt     (I64# i#) = I# i#
668
669 remInt64  (I64# x) (I64# y) = I64# (x `remInt#` y)
670 quotInt64 (I64# x) (I64# y) = I64# (x `quotInt#` y)
671
672 int64ToInteger (I64# i#) = toInteger (I# i#)
673 integerToInt64 i = case fromInteger i of { I# i# -> I64# i# }
674
675 intToInt64 (I# i#) = I64# i#
676 int64ToInt (I64# i#) = I# i#
677
678 #else
679 --assume: support for long-longs
680 data Int64 = I64# Int64#
681
682 int32ToInt64 (I32# i#) = I64# (intToInt64# i#)
683 int64ToInt32 (I64# i#) = I32# (int64ToInt# i#)
684
685 int64ToInteger (I64# x#) = 
686    case int64ToInteger# x# of
687      (# s#, p# #) -> J# s# p#
688
689 integerToInt64 (S# i#) = I64# (intToInt64# i#)
690 integerToInt64 (J# s# d#) = I64# (integerToInt64# s# d#)
691
692 instance Eq  Int64     where 
693   (I64# x) == (I64# y) = x `eqInt64#` y
694   (I64# x) /= (I64# y) = x `neInt64#` y
695
696 instance Ord Int64     where 
697   compare (I64# x) (I64# y)   = compareInt64# x y
698   (<)  (I64# x) (I64# y)      = x `ltInt64#` y
699   (<=) (I64# x) (I64# y)      = x `leInt64#` y
700   (>=) (I64# x) (I64# y)      = x `geInt64#` y
701   (>)  (I64# x) (I64# y)      = x `gtInt64#` y
702   max x@(I64# x#) y@(I64# y#) = 
703      case (compareInt64# x# y#) of { LT -> y ; EQ -> x ; GT -> x }
704   min x@(I64# x#) y@(I64# y#) =
705      case (compareInt64# x# y#) of { LT -> x ; EQ -> x ; GT -> y }
706
707 instance Num Int64 where
708   (I64# x) + (I64# y) = I64# (x `plusInt64#`  y)
709   (I64# x) - (I64# y) = I64# (x `minusInt64#` y)
710   (I64# x) * (I64# y) = I64# (x `timesInt64#` y)
711   negate (I64# x)     = I64# (negateInt64# x)
712   abs x               = absReal x
713   signum              = signumReal
714   fromInteger i       = integerToInt64 i
715   fromInt     i       = intToInt64 i
716
717 compareInt64# :: Int64# -> Int64# -> Ordering
718 compareInt64# i# j# 
719  | i# `ltInt64#` j# = LT
720  | i# `eqInt64#` j# = EQ
721  | otherwise        = GT
722
723 instance Bounded Int64 where
724   minBound = integerToInt64 (-0x8000000000000000)
725   maxBound = integerToInt64 0x7fffffffffffffff
726
727 instance Integral Int64 where
728     div x y
729       | x > 0 && y < 0  = quotInt64 (x-y-1) y
730       | x < 0 && y > 0  = quotInt64 (x-y+1) y
731       | otherwise       = quotInt64 x y
732
733     quot x@(I64# _) y@(I64# y#)
734        | y# `neInt64#` (intToInt64# 0#) = x `quotInt64` y
735        | otherwise = divZeroError "quot{Int64}" x
736
737     rem x@(I64# _) y@(I64# y#)
738        | y# `neInt64#` (intToInt64# 0#) = x `remInt64` y
739        | otherwise = divZeroError "rem{Int64}" x
740
741     mod x y
742        | x > 0 && y < 0 || x < 0 && y > 0 = if r/=0 then r+y else 0
743        | otherwise = r
744         where r = remInt64 x y
745
746     a@(I64# _) `quotRem` b@(I64# _) = (a `quotInt64` b, a `remInt64` b)
747     toInteger i         = int64ToInteger i
748     toInt     i         = int64ToInt i
749
750 remInt64, quotInt64 :: Int64 -> Int64 -> Int64
751 remInt64  (I64# x) (I64# y) = I64# (x `remInt64#` y)
752 quotInt64 (I64# x) (I64# y) = I64# (x `quotInt64#` y)
753
754 intToInt64 (I# i#) = I64# (intToInt64# i#)
755 int64ToInt (I64# i#) = I# (int64ToInt# i#)
756
757 -- Int64# primop wrappers:
758
759 ltInt64# :: Int64# -> Int64# -> Bool
760 ltInt64# x# y# = stg_ltInt64 x# y# /=# 0#
761       
762 leInt64# :: Int64# -> Int64# -> Bool
763 leInt64# x# y# = stg_leInt64 x# y# /=# 0#
764
765 eqInt64# :: Int64# -> Int64# -> Bool
766 eqInt64# x# y# = stg_eqInt64 x# y# /=# 0#
767
768 neInt64# :: Int64# -> Int64# -> Bool
769 neInt64# x# y# = stg_neInt64 x# y# /=# 0#
770
771 geInt64# :: Int64# -> Int64# -> Bool
772 geInt64# x# y# = stg_geInt64 x# y# /=# 0#
773
774 gtInt64# :: Int64# -> Int64# -> Bool
775 gtInt64# x# y# = stg_gtInt64 x# y# /=# 0#
776
777 foreign import "stg_intToInt64" unsafe intToInt64# :: Int# -> Int64#
778 foreign import "stg_int64ToInt" unsafe int64ToInt# :: Int64# -> Int#
779 foreign import "stg_negateInt64" unsafe negateInt64# :: Int64# -> Int64#
780 foreign import "stg_remInt64" unsafe remInt64# :: Int64# -> Int64# -> Int64#
781 foreign import "stg_quotInt64" unsafe quotInt64# :: Int64# -> Int64# -> Int64#
782 foreign import "stg_timesInt64" unsafe timesInt64# :: Int64# -> Int64# -> Int64#
783 foreign import "stg_minusInt64" unsafe minusInt64# :: Int64# -> Int64# -> Int64#
784 foreign import "stg_plusInt64" unsafe plusInt64# :: Int64# -> Int64# -> Int64#
785 foreign import "stg_gtInt64" unsafe stg_gtInt64 :: Int64# -> Int64# -> Int#
786 foreign import "stg_geInt64" unsafe stg_geInt64 :: Int64# -> Int64# -> Int#
787 foreign import "stg_neInt64" unsafe stg_neInt64 :: Int64# -> Int64# -> Int#
788 foreign import "stg_eqInt64" unsafe stg_eqInt64 :: Int64# -> Int64# -> Int#
789 foreign import "stg_leInt64" unsafe stg_leInt64 :: Int64# -> Int64# -> Int#
790 foreign import "stg_ltInt64" unsafe stg_ltInt64 :: Int64# -> Int64# -> Int#
791
792 #endif
793
794 --
795 -- Code that's independent of Int64 rep.
796 -- 
797 instance CCallable   Int64
798 instance CReturnable Int64
799
800 instance Enum Int64 where
801     succ i
802       | i == maxBound = succError "Int64"
803       | otherwise     = i+1
804
805     pred i
806       | i == minBound = predError "Int64"
807       | otherwise     = i-1
808
809     toEnum    i = intToInt64 i
810     fromEnum  x
811       | x >= intToInt64 (minBound::Int) && x <= intToInt64 (maxBound::Int)
812       = int64ToInt x
813       | otherwise
814       = fromEnumError "Int64" x
815
816     enumFrom e1        = map integerToInt64 [int64ToInteger e1 .. int64ToInteger (maxBound::Int64)]
817     enumFromTo e1 e2   = map integerToInt64 [int64ToInteger e1 .. int64ToInteger e2]
818     enumFromThen e1 e2 = map integerToInt64 [int64ToInteger e1, int64ToInteger e2 .. int64ToInteger last]
819                        where 
820                           last :: Int64
821                           last 
822                            | e2 < e1   = minBound
823                            | otherwise = maxBound
824
825     enumFromThenTo e1 e2 e3 = map integerToInt64 [int64ToInteger e1, int64ToInteger e2 .. int64ToInteger e3]
826
827 instance Show Int64 where
828     showsPrec p i64 = showsPrec p (int64ToInteger i64)
829
830 instance Read Int64 where
831   readsPrec _ s = [ (integerToInt64 x,r) | (x,r) <- readDec s ]
832
833 instance Ix Int64 where
834     range (m,n)          = [m..n]
835     index b@(m,_) i
836            | inRange b i = int64ToInt (i-m)
837            | otherwise   = indexError b i "Int64"
838     inRange (m,n) i      = m <= i && i <= n
839
840 instance Real Int64 where
841   toRational x = toInteger x % 1
842
843 #if WORD_SIZE_IN_BYTES == 8
844 instance Bits Int64 where
845   (I64# x) .&. (I64# y)   = I64# (word2Int# ((int2Word# x) `and#` (int2Word# y)))
846   (I64# x) .|. (I64# y)   = I64# (word2Int# ((int2Word# x) `or#`  (int2Word# y)))
847   (I64# x) `xor` (I64# y) = I64# (word2Int# ((int2Word# x) `xor#` (int2Word# y)))
848   complement (I64# x)     = I64# (negateInt# x)
849   shift (I64# x) i@(I# i#)
850         | i > 0     = I64# (iShiftL# x  i#)
851         | otherwise = I64# (iShiftRA# x (negateInt# i#))
852   i64@(I64# x)  `rotate` (I# i)
853         | i ==# 0#    = i64
854         | i ># 0#     = 
855              -- ( (x<<i') | ((x&(0x10000000000000000-2^i2))>>i2) )
856              I64# (word2Int# (
857                     (int2Word# (iShiftL# x i')) 
858                           `or#`
859                     (int2Word# (iShiftRA# (word2Int# (
860                                               (int2Word# x) 
861                                                   `and#` 
862                                                (int2Word# (maxBound# -# pow2# i2 +# 1#))))
863                                           i2))))
864         | otherwise = rotate i64 (I# (64# +# i))
865           where
866            i' = word2Int# (int2Word# i `and#` int2Word# 63#)
867            i2 = 64# -# i'
868            (I64# maxBound#) = maxBound
869   bitSize  _    = 64
870   isSigned _    = True
871
872 #else /* WORD_SIZE_IN_BYTES != 8 */
873
874 instance Bits Int64 where
875   (I64# x) .&. (I64# y)   = I64# (word64ToInt64# ((int64ToWord64# x) `and64#` (int64ToWord64# y)))
876   (I64# x) .|. (I64# y)   = I64# (word64ToInt64# ((int64ToWord64# x) `or64#`  (int64ToWord64# y)))
877   (I64# x) `xor` (I64# y) = I64# (word64ToInt64# ((int64ToWord64# x) `xor64#` (int64ToWord64# y)))
878   complement (I64# x)     = I64# (negateInt64# x)
879   shift (I64# x) i@(I# i#)
880         | i > 0     = I64# (iShiftL64# x  i#)
881         | otherwise = I64# (iShiftRA64# x (negateInt# i#))
882   i64@(I64# x)  `rotate` (I# i)
883         | i ==# 0#    = i64
884         | i ># 0#     = 
885              -- ( (x<<i') | ((x&(0x10000000000000000-2^i2))>>i2) )
886              I64# (word64ToInt64# (
887                     (int64ToWord64# (iShiftL64# x i'))                    `or64#`
888                     (int64ToWord64# (iShiftRA64# (word64ToInt64# ((int64ToWord64# x)     `and64#` 
889                                                  (int64ToWord64# (maxBound# `minusInt64#` (pow2_64# i2 `plusInt64#` (intToInt64# 1#))))))
890                                                 i2))))
891         | otherwise = rotate i64 (I# (64# +# i))
892           where
893            i' = word2Int# (int2Word# i `and#` int2Word# 63#)
894            i2 = 64# -# i'
895            (I64# maxBound#) = maxBound
896   bitSize  _    = 64
897   isSigned _    = True
898
899 foreign import "stg_not64" unsafe not64# :: Word64# -> Word64#
900 foreign import "stg_xor64" unsafe xor64# :: Word64# -> Word64# -> Word64#
901 foreign import "stg_or64" unsafe or64# :: Word64# -> Word64# -> Word64#
902 foreign import "stg_and64" unsafe and64# :: Word64# -> Word64# -> Word64#
903 foreign import "stg_shiftRL64" unsafe shiftRL64# :: Word64# -> Int# -> Word64#
904 foreign import "stg_iShiftRA64" unsafe iShiftRA64# :: Int64# -> Int# -> Int64#
905 foreign import "stg_iShiftRL64" unsafe iShiftRL64# :: Int64# -> Int# -> Int64#
906 foreign import "stg_iShiftL64" unsafe iShiftL64# :: Int64# -> Int# -> Int64#
907 foreign import "stg_shiftL64" unsafe shiftL64# :: Word64# -> Int# -> Word64#
908
909 #endif
910
911 -- ---------------------------------------------------------------------------
912 -- Miscellaneous Utilities
913 -- ---------------------------------------------------------------------------
914
915 absReal :: (Ord a, Num a) => a -> a
916 absReal x    | x >= 0    = x
917              | otherwise = -x
918
919 signumReal :: (Ord a, Num a) => a -> a
920 signumReal x | x == 0    =  0
921              | x > 0     =  1
922              | otherwise = -1
923 \end{code}