Skip to content
Snippets Groups Projects
  1. Oct 03, 2000
    • Reuben Thomas's avatar
      [project @ 2000-10-03 10:20:07 by rrt] · f0c9208d
      Reuben Thomas authored
      Backed out bogon (last commit was completely nonsensical).
      f0c9208d
    • Reuben Thomas's avatar
      [project @ 2000-10-03 09:56:58 by rrt] · 33dcf8ef
      Reuben Thomas authored
      Add $(FPTOOLS_TOP)/dll to PATH when running GHC_INPLACE. This is to make the
      inplace compiler pick up the right set of DLLs under Windows, and won't have
      any effect on other platforms (where the dll directory is empty).
      33dcf8ef
    • Simon Peyton Jones's avatar
      [project @ 2000-10-03 09:20:42 by simonpj] · fc8fe3e1
      Simon Peyton Jones authored
      First cut at documenting generic classes
      fc8fe3e1
    • Simon Peyton Jones's avatar
      [project @ 2000-10-03 08:43:00 by simonpj] · 710e2074
      Simon Peyton Jones authored
      --------------------------------------
      	Adding generics		SLPJ Oct 2000
      	--------------------------------------
      
      This big commit adds Hinze/PJ-style generic class definitions, based
      on work by Andrei Serjantov.  For example:
      
        class Bin a where
          toBin   :: a -> [Int]
          fromBin :: [Int] -> (a, [Int])
      
          toBin {| Unit |}    Unit	  = []
          toBin {| a :+: b |} (Inl x)   = 0 : toBin x
          toBin {| a :+: b |} (Inr y)   = 1 : toBin y
          toBin {| a :*: b |} (x :*: y) = toBin x ++ toBin y
      
      
          fromBin {| Unit |}    bs      = (Unit, bs)
          fromBin {| a :+: b |} (0:bs)  = (Inl x, bs')    where (x,bs') = fromBin bs
          fromBin {| a :+: b |} (1:bs)  = (Inr y, bs')    where (y,bs') = fromBin bs
          fromBin {| a :*: b |} bs  	  = (x :*: y, bs'') where (x,bs' ) = fromBin bs
      							  (y,bs'') = fromBin bs'
      
      Now we can say simply
      
        instance Bin a => Bin [a]
      
      and the compiler will derive the appropriate code automatically.
      
      		(About 9k lines of diffs.  Ha!)
      
      
      Generic related things
      ~~~~~~~~~~~~~~~~~~~~~~
      
      * basicTypes/BasicTypes: The EP type (embedding-projection pairs)
      
      * types/TyCon:
      	An extra field in an algebraic tycon (genInfo)
      
      * types/Class, and hsSyn/HsBinds:
      	Each class op (or ClassOpSig) carries information about whether
      	it  	a) has no default method
      		b) has a polymorphic default method
      		c) has a generic default method
      	There's a new data type for this: Class.DefMeth
      
      * types/Generics:
      	A new module containing good chunk of the generic-related code
      	It has a .hi-boot file (alas).
      
      * typecheck/TcInstDcls, typecheck/TcClassDcl:
      	Most of the rest of the generics-related code
      
      * hsSyn/HsTypes:
      	New infix type form to allow types of the form
      		data a :+: b = Inl a | Inr b
      
      * parser/Parser.y, Lex.lhs, rename/ParseIface.y:
      	Deal with the new syntax
      
      * prelude/TysPrim, TysWiredIn:
      	Need to generate generic stuff for the wired-in TyCons
      
      * rename/RnSource RnBinds:
      	A rather gruesome hack to deal with scoping of type variables
      	from a generic patterns.  Details commented in the ClassDecl
      	case of RnSource.rnDecl.
      
      	Of course, there are many minor renamer consequences of the
      	other changes above.
      
      * lib/std/PrelBase.lhs
      	Data type declarations for Unit, :+:, :*:
      
      
      Slightly unrelated housekeeping
      ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
      * hsSyn/HsDecls:
      	ClassDecls now carry the Names for their implied declarations
      	(superclass selectors, tycon, etc) in a list, rather than
      	laid out one by one.  This simplifies code between the parser
      	and the type checker.
      
      * prelude/PrelNames, TysWiredIn:
      	All the RdrNames are now together in PrelNames.
      
      * utils/ListSetOps:
      	Add finite mappings based on equality and association lists (Assoc a b)
      	Move stuff from List.lhs that is related
      710e2074
    • Simon Peyton Jones's avatar
      [project @ 2000-10-03 08:29:30 by simonpj] · af099cc1
      Simon Peyton Jones authored
      Remove dead code mkLookupFun
      af099cc1
  2. Oct 02, 2000
  3. Sep 29, 2000
  4. Sep 28, 2000
    • Simon Peyton Jones's avatar
      [project @ 2000-09-28 16:49:36 by simonpj] · 5f8800e2
      Simon Peyton Jones authored
      Another wibble
      5f8800e2
    • Julian Seward's avatar
      [project @ 2000-09-28 16:17:07 by sewardj] · 7b349762
      Julian Seward authored
      wibbles
      7b349762
    • Julian Seward's avatar
      [project @ 2000-09-28 15:50:04 by sewardj] · 87e26385
      Julian Seward authored
      Fill in details about how CM works.
      87e26385
    • Simon Peyton Jones's avatar
      [project @ 2000-09-28 15:16:20 by simonpj] · 05af0089
      Simon Peyton Jones authored
      Simon's log file; I don't want to lose this!
      05af0089
    • Simon Peyton Jones's avatar
      [project @ 2000-09-28 15:15:48 by simonpj] · fa67ca4d
      Simon Peyton Jones authored
      Wibbles
      fa67ca4d
    • Simon Peyton Jones's avatar
      [project @ 2000-09-28 13:04:14 by simonpj] · 861e836e
      Simon Peyton Jones authored
      ------------------------------------
      	   Mainly PredTypes (28 Sept 00)
      	------------------------------------
      
      Three things in this commit:
      
      	1.  Main thing: tidy up PredTypes
      	2.  Move all Keys into PrelNames
      	3.  Check for unboxed tuples in function args
      
      1. Tidy up PredTypes
      ~~~~~~~~~~~~~~~~~~~~
      The main thing in this commit is to modify the representation of Types
      so that they are a (much) better for the qualified-type world.  This
      should simplify Jeff's life as he proceeds with implicit parameters
      and functional dependencies.  In particular, PredType, introduced by
      Jeff, is now blessed and dignified with a place in TypeRep.lhs:
      
      	data PredType  = Class  Class [Type]
      		       | IParam Name  Type
      
      Consider these examples:
      	f :: (Eq a) => a -> Int
      	g :: (?x :: Int -> Int) => a -> Int
      	h :: (r\l) => {r} => {l::Int | r}
      
      Here the "Eq a" and "?x :: Int -> Int" and "r\l" are all called
      *predicates*, and are represented by a PredType.  (We don't support
      TREX records yet, but the setup is designed to expand to allow them.)
      
      In addition, Type gains an extra constructor:
      
      	data Type = .... | PredTy PredType
      
      so that PredType is injected directly into Type.  So the type
      	p => t
      is represented by
      	PredType p `FunTy` t
      
      I have deleted the hackish IPNote stuff; predicates are dealt with entirely
      through PredTys, not through NoteTy at all.
      
      
      2.  Move Keys into PrelNames
      ~~~~~~~~~~~~~~~~~~~~~~~~~~~~
      This is just a housekeeping operation. I've moved all the pre-assigned Uniques
      (aka Keys) from Unique.lhs into PrelNames.lhs.  I've also moved knowKeyRdrNames
      from PrelInfo down into PrelNames.  This localises in PrelNames lots of stuff
      about predefined names.  Previously one had to alter three files to add one,
      now only one.
      
      3.  Unboxed tuples
      ~~~~~~~~~~~~~~~~~~
      Add a static check for unboxed tuple arguments.  E.g.
      	data T = T (# Int, Int #)
      is illegal
      861e836e
    • Julian Seward's avatar
      [project @ 2000-09-28 12:19:46 by sewardj] · 0be02ed6
      Julian Seward authored
      Define relationship between what CM implements and the HEP interface.
      Start on saying how CM behaves.
      0be02ed6
  5. Sep 27, 2000
  6. Sep 26, 2000
  7. Sep 25, 2000
Loading