This project is mirrored from https://git.haskell.org/packages/old-time.
Pull mirroring failed .
Repository mirroring has been paused due to too many failed attempts. It can be resumed by a project maintainer.
Last successful update .
Repository mirroring has been paused due to too many failed attempts. It can be resumed by a project maintainer.
Last successful update .
- 21 Jun, 2002 1 commit
-
-
simonmar authored
Andy Gill asked me to remove his license to keep things simple.
-
- 20 Jun, 2002 4 commits
- 19 Jun, 2002 1 commit
-
-
simonmar authored
Remove this hack. Happy 1.13 is now required to build GHC.
-
- 18 Jun, 2002 3 commits
-
-
simonpj authored
--------------------------------------- Rehash the handling of SeqOp --------------------------------------- See the comments in the commentary (Cunning Prelude Code). * Expunge SeqOp altogether * Add GHC.Base.lazy :: a -> a to GHC.Base * Add GHC.Base.lazy to basicTypes/MkId. The idea is that this defn will over-ride the info from GHC.Base.hi, thereby hiding strictness and unfolding * Make stranal/WorkWrap do a "manual inlining" for GHC.Base.lazy This happens nicely after the strictness analyser has run. * Expunge the SeqOp/ParOp magic in CorePrep * Expunge the RULE for seq in PrelRules * Change the defns of pseq/par in GHC.Conc to: {-# INLINE pseq #-} pseq :: a -> b -> b pseq x y = x `seq` lazy y {-# INLINE par #-} par :: a -> b -> b par x y = case (par# x) of { _ -> lazy y }
-
simonmar authored
Fix bug in the implementation of hGetLine: on finding the EOF when we have a partial line in our hands, we weren't resetting the state of the buffer to empty, so the same partial line would be returned for each subsequent call to hGetLine.
-
simonpj authored
-------------------------- Deal with NaN and Infinity -------------------------- This commit arranges that * GHC.Real exports infinity :: Rational = 1 :% 0 notANumber :: Rational = 0 :% 0 * GHC.Float.fromRat converts these Rational non-numbers into their Float/Double equivalents As a result, arith015/arith016 start to work again. We can read NaN and Infinity into Float/Double.
-
- 14 Jun, 2002 1 commit
-
-
simonpj authored
Add comment
-
- 13 Jun, 2002 2 commits
- 11 Jun, 2002 1 commit
-
-
simonmar authored
typo in email address (noticed by J?n Fairbairn, thanks J?n).
-
- 09 Jun, 2002 1 commit
-
-
panne authored
Use :%, not % for Inf/NaN, the latter would immediately lead to a runtime error. Note that isInfinite (read "Infinity" :: Float) or isInfinite (fromRational (1 :% 0)) still don't work, because fromRational is not OK for those cases.
-
- 08 Jun, 2002 2 commits
- 06 Jun, 2002 2 commits
- 05 Jun, 2002 2 commits
-
-
simonpj authored
------------------------------------------------ Fix the (new) lexer, and make the derived read and show code work according to the new H98 report ------------------------------------------------ The new lexer, based on Koen's cunning parser (Text.ParserCombinators.ReadP) wasn't quite right. It's all very cool now. In particular: * The H98 "lex" function should return the exact string parsed, and it now does, aided by the new combinator ReadP.gather. * As a result the Text.Read.Lex Lexeme type is much simpler than before data Lexeme = Char Char -- Quotes removed, | String String -- escapes interpreted | Punc String -- Punctuation, eg "(", "::" | Ident String -- Haskell identifiers, e.g. foo, baz | Symbol String -- Haskell symbols, e.g. >>, % | Int Integer | Rat Rational | EOF deriving (Eq,Show) * Multi-character punctuation, like "::" was getting lexed as a Symbol, but it should be a Punc. * Parsing numbers wasn't quite right. "1..n" got it confused because it got committed to a decimal point and then found a second '.'. * The new H98 spec for Show is there, which ignores associativity.
-
ross authored
documentation adjustments.
-
- 04 Jun, 2002 2 commits
- 03 Jun, 2002 1 commit
-
-
simonmar authored
IO.hGetContents ==> System.IO.hGetContents (in docs)
-
- 31 May, 2002 2 commits
- 29 May, 2002 3 commits
- 28 May, 2002 12 commits
-
-
sof authored
make it compile
-
simonmar authored
Documentation for the overloaded array interfaces (currently a bit flaky due to a couple of shortcomings in Haddock).
-
simonmar authored
Documentation
-
simonmar authored
Documentation
-
simonmar authored
Add (minimal) documentation
-
simonmar authored
Fix mistake in 'evaluate'.
-
simonmar authored
Document
-
simonmar authored
typo
-
simonmar authored
Export list tweak
-
simonmar authored
Documentation tweaks
-
simonmar authored
tweak documentationa
-
simonmar authored
Add documentation
-