X-Git-Url: http://git.megacz.com/?a=blobdiff_plain;f=ghc%2Fcompiler%2FbasicTypes%2FId.lhs;h=786d69a4ceddbed4344b6c82c279951c771dcfe2;hb=dcef38bab91d45b56f7cf3ceeec96303d93728bb;hp=adbd61f788cba4f3d5eebd4bc8e5570d06a5070c;hpb=7b0181919416d8f04324575b7e17031ca692f5b0;p=ghc-hetmet.git diff --git a/ghc/compiler/basicTypes/Id.lhs b/ghc/compiler/basicTypes/Id.lhs index adbd61f..786d69a 100644 --- a/ghc/compiler/basicTypes/Id.lhs +++ b/ghc/compiler/basicTypes/Id.lhs @@ -6,135 +6,196 @@ \begin{code} #include "HsVersions.h" -module Id {- ( - GenId, Id(..), -- Abstract - StrictnessMark(..), -- An enumaration - ConTag(..), DictVar(..), DictFun(..), DataCon(..), +module Id ( + -- TYPES + GenId(..), -- *naughtily* used in some places (e.g., TcHsSyn) + SYN_IE(Id), IdDetails, + StrictnessMark(..), + SYN_IE(ConTag), fIRST_TAG, + SYN_IE(DataCon), SYN_IE(DictFun), SYN_IE(DictVar), -- CONSTRUCTION - mkSysLocal, mkUserLocal, - mkSpecPragmaId, - mkSpecId, mkSameSpecCon, - selectIdInfoForSpecId, + mkConstMethodId, + mkDataCon, + mkDefaultMethodId, + mkDictFunId, + mkIdWithNewUniq, mkIdWithNewName, + mkImported, + mkInstId, + mkMethodSelId, + mkRecordSelId, + mkSuperDictSelId, + mkSysLocal, mkTemplateLocals, - mkImported, mkPreludeId, - mkDataCon, mkTupleCon, - mkIdWithNewUniq, - mkMethodSelId, mkSuperDictSelId, mkDefaultMethodId, - mkConstMethodId, getConstMethodId, - - updateIdType, - mkId, mkDictFunId, mkInstId, + mkTupleCon, + mkUserId, + mkUserLocal, mkWorkerId, - localiseId, + mkPrimitiveId, + setIdVisibility, - -- DESTRUCTION + -- DESTRUCTION (excluding pragmatic info) + idPrimRep, idType, - getIdInfo, replaceIdInfo, - getPragmaInfo, - idPrimRep, getInstIdModule, - getMentionedTyConsAndClassesFromId, + idUnique, - dataConTag, dataConStrictMarks, - dataConSig, dataConArgTys, - dataConTyCon, dataConArity, + dataConRepType, + dataConArgTys, + dataConNumFields, dataConFieldLabels, + dataConRawArgTys, + dataConSig, + dataConStrictMarks, + dataConTag, + dataConTyCon, recordSelectorFieldLabel, -- PREDICATES - isDataCon, isTupleCon, - isSpecId_maybe, isSpecPragmaId_maybe, - toplevelishId, externallyVisibleId, - isTopLevId, isWorkerId, isWrapperId, - isImportedId, isSysLocalId, + omitIfaceSigForId, + cmpEqDataCon, + cmpId, + cmpId_withSpecDataCon, + externallyVisibleId, + idHasNoFreeTyVars, + idWantsToBeINLINEd, getInlinePragma, + idMustBeINLINEd, idMustNotBeINLINEd, isBottomingId, - isMethodSelId, isDefaultMethodId_maybe, isSuperDictSelId_maybe, - isDictFunId, ---??? isInstId_maybe, + isConstMethodId, isConstMethodId_maybe, - cmpId_withSpecDataCon, - myWrapperMaybe, - whatsMentionedInId, - unfoldingUnfriendlyId, -- ToDo: rm, eventually - idWantsToBeINLINEd, --- dataConMentionsNonPreludeTyCon, + isDataCon, + isDefaultMethodId, + isDefaultMethodId_maybe, + isDictFunId, + isImportedId, + isRecordSelector, + isMethodSelId_maybe, + isNullaryDataCon, + isSpecPragmaId, + isSuperDictSelId_maybe, + isPrimitiveId_maybe, + isSysLocalId, + isTupleCon, + isWorkerId, + isWrapperId, + toplevelishId, + unfoldingUnfriendlyId, -- SUBSTITUTION - applySubstToId, applyTypeEnvToId, --- not exported: apply_to_Id, -- please don't use this, generally - - -- UNFOLDING, ARITY, UPDATE, AND STRICTNESS STUFF (etc) - getIdArity, addIdArity, - getIdDemandInfo, addIdDemandInfo, - getIdSpecialisation, addIdSpecialisation, - getIdStrictness, addIdStrictness, - getIdUnfolding, addIdUnfolding, - getIdUpdateInfo, addIdUpdateInfo, - getIdArgUsageInfo, addIdArgUsageInfo, - getIdFBTypeInfo, addIdFBTypeInfo, - -- don't export the types, lest OptIdInfo be dragged in! - - -- MISCELLANEOUS - unlocaliseId, - fIRST_TAG, + applyTypeEnvToId, + apply_to_Id, + + -- PRINTING and RENUMBERING + addId, + nmbrDataCon, + nmbrId, + pprId, showId, - pprIdInUnfolding, - -- "Environments" keyed off of Ids, and sets of Ids - IdEnv(..), - lookupIdEnv, lookupNoFailIdEnv, nullIdEnv, unitIdEnv, mkIdEnv, - growIdEnv, growIdEnvList, isNullIdEnv, addOneToIdEnv, - delOneFromIdEnv, delManyFromIdEnv, modifyIdEnv, combineIdEnvs, - rngIdEnv, mapIdEnv, + -- Specialialisation + getIdSpecialisation, + addIdSpecialisation, - -- and to make the interface self-sufficient... - GenIdSet(..), IdSet(..) - )-} where + -- UNFOLDING, ARITY, UPDATE, AND STRICTNESS STUFF (etc) + addIdUnfolding, + addIdArity, + addIdDemandInfo, + addIdStrictness, + addIdUpdateInfo, + getIdArity, + getIdDemandInfo, + getIdInfo, + getIdStrictness, + getIdUnfolding, + getIdUpdateInfo, + getPragmaInfo, + replaceIdInfo, + addInlinePragma, nukeNoInlinePragma, addNoInlinePragma, + + -- IdEnvs AND IdSets + SYN_IE(IdEnv), SYN_IE(GenIdSet), SYN_IE(IdSet), + addOneToIdEnv, + addOneToIdSet, + combineIdEnvs, + delManyFromIdEnv, + delOneFromIdEnv, + elementOfIdSet, + emptyIdSet, + growIdEnv, + growIdEnvList, + idSetToList, + intersectIdSets, + isEmptyIdSet, + isNullIdEnv, + lookupIdEnv, + lookupNoFailIdEnv, + mapIdEnv, + minusIdSet, + mkIdEnv, + mkIdSet, + modifyIdEnv, + modifyIdEnv_Directly, + nullIdEnv, + rngIdEnv, + unionIdSets, + unionManyIdSets, + unitIdEnv, + unitIdSet + ) where + +IMP_Ubiq() + +IMPORT_DELOOPER(IdLoop) -- for paranoia checking +IMPORT_DELOOPER(TyLoop) -- for paranoia checking -import Ubiq -import IdLoop -- for paranoia checking -import TyLoop -- for paranoia checking import Bag -import Class ( getClassOpString, Class(..), GenClass, ClassOp(..), GenClassOp ) -import CStrings ( identToC, cSEP ) +import Class ( classOpString, SYN_IE(Class), GenClass, SYN_IE(ClassOp), GenClassOp ) import IdInfo import Maybes ( maybeToBool ) -import Name ( appendRdr, nameUnique, mkLocalName, isLocalName, - isLocallyDefinedName, isPreludeDefinedName, - nameOrigName, - isAvarop, isAconop, getLocalName, - isLocallyDefined, isPreludeDefined, - getOrigName, getOccName, - isExported, ExportFlag(..), - RdrName(..), Name - ) -import FieldLabel ( fieldLabelName, FieldLabel{-instances-} ) +import Name {- ( nameUnique, mkLocalName, mkSysLocalName, isLocalName, + mkCompoundName, mkInstDeclName, + isLocallyDefinedName, occNameString, modAndOcc, + isLocallyDefined, changeUnique, isWiredInName, + nameString, getOccString, setNameVisibility, + isExported, ExportFlag(..), DefnInfo, Provenance, + OccName(..), Name + ) -} +import PrelMods ( pREL_TUP, pREL_BASE ) +import Lex ( mkTupNameStr ) +import FieldLabel ( fieldLabelName, FieldLabel(..){-instances-} ) import PragmaInfo ( PragmaInfo(..) ) -import PrelMods ( pRELUDE_BUILTIN ) -import PprType ( getTypeString, typeMaybeString, specMaybeTysSuffix, +#if __GLASGOW_HASKELL__ >= 202 +import PrimOp ( PrimOp ) +#endif +import PprEnv -- ( SYN_IE(NmbrM), NmbrEnv(..) ) +import PprType ( getTypeString, specMaybeTysSuffix, + nmbrType, nmbrTyVar, GenType, GenTyVar ) import PprStyle import Pretty -import SrcLoc ( mkBuiltinSrcLoc ) -import TyCon ( TyCon, mkTupleTyCon, tyConDataCons ) -import Type ( mkSigmaTy, mkTyVarTys, mkFunTys, mkDictTy, - applyTyCon, isPrimType, instantiateTy, +import MatchEnv ( MatchEnv ) +import SrcLoc --( mkBuiltinSrcLoc ) +import TysWiredIn ( tupleTyCon ) +import TyCon --( TyCon, tyConDataCons ) +import Type {- ( mkSigmaTy, mkTyVarTys, mkFunTys, mkDictTy, + applyTyCon, instantiateTy, mkForAllTys, tyVarsOfType, applyTypeEnvToTy, typePrimRep, - GenType, ThetaType(..), TauType(..), Type(..) - ) -import TyVar ( alphaTyVars, isEmptyTyVarSet, TyVarEnv(..) ) + GenType, SYN_IE(ThetaType), SYN_IE(TauType), SYN_IE(Type) + ) -} +import TyVar --( alphaTyVars, isEmptyTyVarSet, SYN_IE(TyVarEnv) ) +import Usage ( SYN_IE(UVar) ) import UniqFM import UniqSet -- practically all of it -import UniqSupply ( getBuiltinUniques ) -import Unique ( mkTupleDataConUnique, pprUnique, showUnique, +import Unique ( getBuiltinUniques, pprUnique, showUnique, + incrUnique, Unique{-instance Ord3-} ) -import Util ( mapAccumL, nOfThem, zipEqual, +import Outputable ( ifPprDebug, Outputable(..) ) +import Util {- ( mapAccumL, nOfThem, zipEqual, assoc, panic, panic#, pprPanic, assertPanic - ) + ) -} \end{code} Here are the @Id@ and @IdDetails@ datatypes; also see the notes that @@ -150,13 +211,14 @@ ToDo: possibly cache other stuff in the single-constructor @Id@ type. \begin{code} data GenId ty = Id Unique -- Key for fast comparison + Name ty -- Id's type; used all the time; IdDetails -- Stuff about individual kinds of Ids. PragmaInfo -- Properties of this Id requested by programmer -- eg specialise-me, inline-me IdInfo -- Properties of this Id deduced by compiler -type Id = GenId Type +type Id = GenId Type data StrictnessMark = MarkedStrict | NotMarkedStrict @@ -164,42 +226,38 @@ data IdDetails ---------------- Local values - = LocalId Name -- Local name; mentioned by the user - Bool -- True <=> no free type vars + = LocalId Bool -- Local name; mentioned by the user + -- True <=> no free type vars - | SysLocalId Name -- Local name; made up by the compiler - Bool -- as for LocalId + | SysLocalId Bool -- Local name; made up by the compiler + -- as for LocalId + + | PrimitiveId PrimOp -- The Id for a primitive operation - | SpecPragmaId Name -- Local name; introduced by the compiler + | SpecPragmaId -- Local name; introduced by the compiler (Maybe Id) -- for explicit specid in pragma Bool -- as for LocalId ---------------- Global values - | ImportedId Name -- Global name (Imported or Implicit); Id imported from an interface - - | PreludeId Name -- Global name (Builtin); Builtin prelude Ids - - | TopLevId Name -- Global name (LocalDef); Top-level in the orig source pgm - -- (not moved there by transformations). - - -- a TopLevId's type may contain free type variables, if - -- the monomorphism restriction applies. + | ImportedId -- Global name (Imported or Implicit); Id imported from an interface ---------------- Data constructors - | DataConId Name - ConTag + | DataConId ConTag [StrictnessMark] -- Strict args; length = arity - [FieldLabel] -- Field labels for this constructor + [FieldLabel] -- Field labels for this constructor; + --length = 0 (not a record) or arity - [TyVar] [(Class,Type)] [Type] TyCon + [TyVar] [(Class,Type)] -- Type vars and context for the data type decl + [TyVar] [(Class,Type)] -- Ditto for the context of the constructor, + -- the existentially quantified stuff + [Type] TyCon -- Args and result tycon -- the type is: - -- forall tyvars . theta_ty => + -- forall tyvars1 ++ tyvars2. theta1 ++ theta2 => -- unitype_1 -> ... -> unitype_n -> tycon tyvars - | TupleConId Name - Int -- Its arity + | TupleConId Int -- Its arity | RecordSelId FieldLabel @@ -234,8 +292,6 @@ data IdDetails -- The "a" is irrelevant. As it is too painful to -- actually do comparisons that way, we kindly supply -- a Unique for that purpose. - Bool -- True <=> from an instance decl in this mod - (Maybe Module) -- module where instance came from; Nothing => Prelude -- see below | ConstMethodId -- A method which depends only on the type of the @@ -243,10 +299,9 @@ data IdDetails Class -- Uniquely identified by: Type -- (class, type, classop) triple ClassOp - Bool -- True => from an instance decl in this mod - (Maybe Module) -- module where instance came from; Nothing => Prelude + Module -- module where instance came from - | InstId Name -- An instance of a dictionary, class operation, + | InstId -- An instance of a dictionary, class operation, -- or overloaded value (Local name) Bool -- as for LocalId @@ -259,17 +314,17 @@ data IdDetails -- we may specialise to a type w/ free tyvars -- (i.e., in one of the "Maybe Type" dudes). +-- Scheduled for deletion: SLPJ Nov 96 +-- Nobody seems to depend on knowing this. | WorkerId -- A "worker" for some other Id Id -- Id for which this is a worker - type ConTag = Int type DictVar = Id type DictFun = Id type DataCon = Id \end{code} - DictFunIds are generated from instance decls. \begin{verbatim} class Foo a where @@ -359,27 +414,6 @@ the infinite family of tuples. their @IdInfo@). %---------------------------------------------------------------------- -\item[@PreludeId@:] ToDo - -%---------------------------------------------------------------------- -\item[@TopLevId@:] These are values defined at the top-level in this -module; i.e., those which {\em might} be exported (hence, a -@Name@). It does {\em not} include those which are moved to the -top-level through program transformations. - -We also guarantee that @TopLevIds@ will {\em stay} at top-level. -Theoretically, they could be floated inwards, but there's no known -advantage in doing so. This way, we can keep them with the same -@Unique@ throughout (no cloning), and, in general, we don't have to be -so paranoid about them. - -In particular, we had the following problem generating an interface: -We have to ``stitch together'' info (1)~from the typechecker-produced -global-values list (GVE) and (2)~from the STG code [which @Ids@ have -what arities]. If the @Uniques@ on the @TopLevIds@ can {\em change} -between (1) and (2), you're sunk! - -%---------------------------------------------------------------------- \item[@MethodSelId@:] A selector from a dictionary; it may select either a method or a dictionary for one of the class's superclasses. @@ -429,7 +463,7 @@ Further remarks: %---------------------------------------------------------------------- \item -@DataCons@ @TupleCons@, @Importeds@, @TopLevIds@, @SuperDictSelIds@, +@DataCons@ @TupleCons@, @Importeds@, @SuperDictSelIds@, @MethodSelIds@, @DictFunIds@, and @DefaultMethodIds@ have the following properties: \begin{itemize} @@ -452,287 +486,153 @@ properties, but they may not. %************************************************************************ \begin{code} -unsafeGenId2Id :: GenId ty -> Id -unsafeGenId2Id (Id u ty d p i) = Id u (panic "unsafeGenId2Id:ty") d p i - -isDataCon id = is_data (unsafeGenId2Id id) - where - is_data (Id _ _ (DataConId _ _ _ _ _ _ _ _) _ _) = True - is_data (Id _ _ (TupleConId _ _) _ _) = True - is_data (Id _ _ (SpecId unspec _ _) _ _) = is_data unspec - is_data other = False +isDataCon (Id _ _ _ (DataConId _ __ _ _ _ _ _ _) _ _) = True +isDataCon (Id _ _ _ (TupleConId _) _ _) = True +isDataCon (Id _ _ _ (SpecId unspec _ _) _ _) = isDataCon unspec +isDataCon other = False - -isTupleCon id = is_tuple (unsafeGenId2Id id) - where - is_tuple (Id _ _ (TupleConId _ _) _ _) = True - is_tuple (Id _ _ (SpecId unspec _ _) _ _) = is_tuple unspec - is_tuple other = False +isTupleCon (Id _ _ _ (TupleConId _) _ _) = True +isTupleCon (Id _ _ _ (SpecId unspec _ _) _ _) = isTupleCon unspec +isTupleCon other = False {-LATER: -isSpecId_maybe (Id _ _ (SpecId unspec ty_maybes _) _ _) +isSpecId_maybe (Id _ _ _ (SpecId unspec ty_maybes _) _ _) = ASSERT(not (maybeToBool (isSpecId_maybe unspec))) Just (unspec, ty_maybes) isSpecId_maybe other_id = Nothing -isSpecPragmaId_maybe (Id _ _ (SpecPragmaId _ specid _) _ _) +isSpecPragmaId_maybe (Id _ _ _ (SpecPragmaId specid _) _ _) = Just specid isSpecPragmaId_maybe other_id = Nothing -} \end{code} -@toplevelishId@ tells whether an @Id@ {\em may} be defined in a -nested @let(rec)@ (returns @False@), or whether it is {\em sure} to be -defined at top level (returns @True@). This is used to decide whether -the @Id@ is a candidate free variable. NB: you are only {\em sure} +@toplevelishId@ tells whether an @Id@ {\em may} be defined in a nested +@let(rec)@ (returns @False@), or whether it is {\em sure} to be +defined at top level (returns @True@). This is used to decide whether +the @Id@ is a candidate free variable. NB: you are only {\em sure} about something if it returns @True@! \begin{code} -toplevelishId :: Id -> Bool -idHasNoFreeTyVars :: Id -> Bool +toplevelishId :: Id -> Bool +idHasNoFreeTyVars :: Id -> Bool -toplevelishId (Id _ _ details _ _) +toplevelishId (Id _ _ _ details _ _) = chk details where - chk (DataConId _ _ _ _ _ _ _ _) = True - chk (TupleConId _ _) = True + chk (DataConId _ __ _ _ _ _ _ _) = True + chk (TupleConId _) = True chk (RecordSelId _) = True - chk (ImportedId _) = True - chk (PreludeId _) = True - chk (TopLevId _) = True -- NB: see notes + chk ImportedId = True chk (SuperDictSelId _ _) = True chk (MethodSelId _ _) = True chk (DefaultMethodId _ _ _) = True - chk (DictFunId _ _ _ _) = True - chk (ConstMethodId _ _ _ _ _) = True + chk (DictFunId _ _) = True + chk (ConstMethodId _ _ _ _) = True chk (SpecId unspec _ _) = toplevelishId unspec -- depends what the unspecialised thing is chk (WorkerId unwrkr) = toplevelishId unwrkr - chk (InstId _ _) = False -- these are local - chk (LocalId _ _) = False - chk (SysLocalId _ _) = False - chk (SpecPragmaId _ _ _) = False + chk (InstId _) = False -- these are local + chk (LocalId _) = False + chk (SysLocalId _) = False + chk (SpecPragmaId _ _) = False + chk (PrimitiveId _) = True -idHasNoFreeTyVars (Id _ _ details _ info) +idHasNoFreeTyVars (Id _ _ _ details _ info) = chk details where - chk (DataConId _ _ _ _ _ _ _ _) = True - chk (TupleConId _ _) = True + chk (DataConId _ _ _ _ _ _ _ _ _) = True + chk (TupleConId _) = True chk (RecordSelId _) = True - chk (ImportedId _) = True - chk (PreludeId _) = True - chk (TopLevId _) = True + chk ImportedId = True chk (SuperDictSelId _ _) = True chk (MethodSelId _ _) = True chk (DefaultMethodId _ _ _) = True - chk (DictFunId _ _ _ _) = True - chk (ConstMethodId _ _ _ _ _) = True + chk (DictFunId _ _) = True + chk (ConstMethodId _ _ _ _) = True chk (WorkerId unwrkr) = idHasNoFreeTyVars unwrkr - chk (InstId _ no_free_tvs) = no_free_tvs chk (SpecId _ _ no_free_tvs) = no_free_tvs - chk (LocalId _ no_free_tvs) = no_free_tvs - chk (SysLocalId _ no_free_tvs) = no_free_tvs - chk (SpecPragmaId _ _ no_free_tvs) = no_free_tvs + chk (InstId no_free_tvs) = no_free_tvs + chk (LocalId no_free_tvs) = no_free_tvs + chk (SysLocalId no_free_tvs) = no_free_tvs + chk (SpecPragmaId _ no_free_tvs) = no_free_tvs + chk (PrimitiveId _) = True + +-- omitIfaceSigForId tells whether an Id's info is implied by other declarations, +-- so we don't need to put its signature in an interface file, even if it's mentioned +-- in some other interface unfolding. + +omitIfaceSigForId + :: Id + -> Bool + +omitIfaceSigForId (Id _ name _ details _ _) + | isWiredInName name + = True + + | otherwise + = case details of + ImportedId -> True -- Never put imports in interface file + (PrimitiveId _) -> True -- Ditto, for primitives + + -- This group is Ids that are implied by their type or class decl; + -- remember that all type and class decls appear in the interface file. + -- The dfun id must *not* be omitted, because it carries version info for + -- the instance decl + (DataConId _ _ _ _ _ _ _ _ _) -> True + (TupleConId _) -> True + (RecordSelId _) -> True + (SuperDictSelId _ _) -> True + (MethodSelId _ _) -> True + + other -> False -- Don't omit! + -- NB DefaultMethodIds are not omitted \end{code} \begin{code} -isTopLevId (Id _ _ (TopLevId _) _ _) = True -isTopLevId other = False +isImportedId (Id _ _ _ ImportedId _ _) = True +isImportedId other = False -isImportedId (Id _ _ (ImportedId _) _ _) = True -isImportedId other = False +isBottomingId (Id _ _ _ _ _ info) = bottomIsGuaranteed (strictnessInfo info) -isBottomingId (Id _ _ _ _ info) = bottomIsGuaranteed (getInfo info) - -isSysLocalId (Id _ _ (SysLocalId _ _) _ _) = True +isSysLocalId (Id _ _ _ (SysLocalId _) _ _) = True isSysLocalId other = False -isSpecPragmaId (Id _ _ (SpecPragmaId _ _ _) _ _) = True +isSpecPragmaId (Id _ _ _ (SpecPragmaId _ _) _ _) = True isSpecPragmaId other = False -isMethodSelId (Id _ _ (MethodSelId _ _) _ _) = True -isMethodSelId _ = False +isMethodSelId_maybe (Id _ _ _ (MethodSelId cls op) _ _) = Just (cls,op) +isMethodSelId_maybe _ = Nothing -isDefaultMethodId (Id _ _ (DefaultMethodId _ _ _) _ _) = True -isDefaultMethodId other = False +isDefaultMethodId (Id _ _ _ (DefaultMethodId _ _ _) _ _) = True +isDefaultMethodId other = False -isDefaultMethodId_maybe (Id _ _ (DefaultMethodId cls clsop err) _ _) +isDefaultMethodId_maybe (Id _ _ _ (DefaultMethodId cls clsop err) _ _) = Just (cls, clsop, err) isDefaultMethodId_maybe other = Nothing -isDictFunId (Id _ _ (DictFunId _ _ _ _) _ _) = True -isDictFunId other = False +isDictFunId (Id _ _ _ (DictFunId _ _) _ _) = True +isDictFunId other = False -isConstMethodId (Id _ _ (ConstMethodId _ _ _ _ _) _ _) = True +isConstMethodId (Id _ _ _ (ConstMethodId _ _ _ _) _ _) = True isConstMethodId other = False -isConstMethodId_maybe (Id _ _ (ConstMethodId cls ty clsop _ _) _ _) +isConstMethodId_maybe (Id _ _ _ (ConstMethodId cls ty clsop _) _ _) = Just (cls, ty, clsop) isConstMethodId_maybe other = Nothing -isSuperDictSelId_maybe (Id _ _ (SuperDictSelId c sc) _ _) = Just (c, sc) +isSuperDictSelId_maybe (Id _ _ _ (SuperDictSelId c sc) _ _) = Just (c, sc) isSuperDictSelId_maybe other_id = Nothing -isWorkerId (Id _ _ (WorkerId _) _ _) = True +isWorkerId (Id _ _ _ (WorkerId _) _ _) = True isWorkerId other = False -{-LATER: isWrapperId id = workerExists (getIdStrictness id) --} -\end{code} - -\begin{code} -{-LATER: -pprIdInUnfolding :: IdSet -> Id -> Pretty - -pprIdInUnfolding in_scopes v - = let - v_ty = idType v - in - -- local vars first: - if v `elementOfUniqSet` in_scopes then - pprUnique (idUnique v) - - -- ubiquitous Ids with special syntax: - else if v == nilDataCon then - ppPStr SLIT("_NIL_") - else if isTupleCon v then - ppBeside (ppPStr SLIT("_TUP_")) (ppInt (dataConArity v)) - - -- ones to think about: - else - let - (Id _ _ v_details _ _) = v - in - case v_details of - -- these ones must have been exported by their original module - ImportedId _ -> pp_full_name - PreludeId _ -> pp_full_name - - -- these ones' exportedness checked later... - TopLevId _ -> pp_full_name - DataConId _ _ _ _ _ _ _ _ -> pp_full_name - - RecordSelId lbl -> ppr sty lbl - - -- class-ish things: class already recorded as "mentioned" - SuperDictSelId c sc - -> ppCat [ppPStr SLIT("_SDSEL_"), pp_class c, pp_class sc] - MethodSelId c o - -> ppCat [ppPStr SLIT("_METH_"), pp_class c, pp_class_op o] - DefaultMethodId c o _ - -> ppCat [ppPStr SLIT("_DEFM_"), pp_class c, pp_class_op o] - - -- instance-ish things: should we try to figure out - -- *exactly* which extra instances have to be exported? (ToDo) - DictFunId c t _ _ - -> ppCat [ppPStr SLIT("_DFUN_"), pp_class c, pp_type t] - ConstMethodId c t o _ _ - -> ppCat [ppPStr SLIT("_CONSTM_"), pp_class c, pp_class_op o, pp_type t] - - -- specialisations and workers - SpecId unspec ty_maybes _ - -> let - pp = pprIdInUnfolding in_scopes unspec - in - ppCat [ppPStr SLIT("_SPEC_"), pp, ppLbrack, - ppIntersperse pp'SP{-'-} (map pp_ty_maybe ty_maybes), - ppRbrack] - - WorkerId unwrkr - -> let - pp = pprIdInUnfolding in_scopes unwrkr - in - ppBeside (ppPStr SLIT("_WRKR_ ")) pp - - -- anything else? we're nae interested - other_id -> panic "pprIdInUnfolding:mystery Id" - where - ppr_Unfolding = PprUnfolding (panic "Id:ppr_Unfolding") - - pp_full_name - = let - (m_str, n_str) = getOrigName v - - pp_n = - if isAvarop n_str || isAconop n_str then - ppBesides [ppLparen, ppPStr n_str, ppRparen] - else - ppPStr n_str - in - if isPreludeDefined v then - pp_n - else - ppCat [ppPStr SLIT("_ORIG_"), ppPStr m_str, pp_n] - - pp_class :: Class -> Pretty - pp_class_op :: ClassOp -> Pretty - pp_type :: Type -> Pretty - pp_ty_maybe :: Maybe Type -> Pretty - pp_class clas = ppr ppr_Unfolding clas - pp_class_op op = ppr ppr_Unfolding op - - pp_type t = ppBesides [ppLparen, ppr ppr_Unfolding t, ppRparen] - - pp_ty_maybe Nothing = ppPStr SLIT("_N_") - pp_ty_maybe (Just t) = pp_type t --} -\end{code} - -@whatsMentionedInId@ ferrets out the types/classes/instances on which -this @Id@ depends. If this Id is to appear in an interface, then -those entities had Jolly Well be in scope. Someone else up the -call-tree decides that. - -\begin{code} -{-LATER: -whatsMentionedInId - :: IdSet -- Ids known to be in scope - -> Id -- Id being processed - -> (Bag Id, Bag TyCon, Bag Class) -- mentioned Ids/TyCons/etc. - -whatsMentionedInId in_scopes v - = let - v_ty = idType v - - (tycons, clss) - = getMentionedTyConsAndClassesFromType v_ty - - result0 id_bag = (id_bag, tycons, clss) - - result1 ids tcs cs - = (ids `unionBags` unitBag v, -- we add v to "mentioned"... - tcs `unionBags` tycons, - cs `unionBags` clss) - in - -- local vars first: - if v `elementOfUniqSet` in_scopes then - result0 emptyBag -- v not added to "mentioned" - - -- ones to think about: - else - let - (Id _ _ v_details _ _) = v - in - case v_details of - -- specialisations and workers - SpecId unspec ty_maybes _ - -> let - (ids2, tcs2, cs2) = whatsMentionedInId in_scopes unspec - in - result1 ids2 tcs2 cs2 - - WorkerId unwrkr - -> let - (ids2, tcs2, cs2) = whatsMentionedInId in_scopes unwrkr - in - result1 ids2 tcs2 cs2 - - anything_else -> result0 (unitBag v) -- v is added to "mentioned" --} +isPrimitiveId_maybe (Id _ _ _ (PrimitiveId primop) _ _) = Just primop +isPrimitiveId_maybe other = Nothing \end{code} Tell them who my wrapper function is. @@ -740,7 +640,7 @@ Tell them who my wrapper function is. {-LATER: myWrapperMaybe :: Id -> Maybe Id -myWrapperMaybe (Id _ _ (WorkerId my_wrapper) _ _) = Just my_wrapper +myWrapperMaybe (Id _ _ _ (WorkerId my_wrapper) _ _) = Just my_wrapper myWrapperMaybe other_id = Nothing -} \end{code} @@ -751,159 +651,20 @@ unfoldingUnfriendlyId -- return True iff it is definitely a bad -> Bool -- mentions this Id. Reason: it cannot -- possibly be seen in another module. -unfoldingUnfriendlyId id = panic "Id.unfoldingUnfriendlyId" -{-LATER: - -unfoldingUnfriendlyId id - | not (externallyVisibleId id) -- that settles that... - = True - -unfoldingUnfriendlyId (Id _ _ (WorkerId wrapper) _ _) - = class_thing wrapper - where - -- "class thing": If we're going to use this worker Id in - -- an interface, we *have* to be able to untangle the wrapper's - -- strictness when reading it back in. At the moment, this - -- is not always possible: in precisely those cases where - -- we pass tcGenPragmas a "Nothing" for its "ty_maybe". - - class_thing (Id _ _ (SuperDictSelId _ _) _ _) = True - class_thing (Id _ _ (MethodSelId _ _) _ _) = True - class_thing (Id _ _ (DefaultMethodId _ _ _) _ _) = True - class_thing other = False - -unfoldingUnfriendlyId (Id _ _ (SpecId d@(Id _ _ _ dfun@(DictFunId _ t _ _)) _ _) _ _) - -- a SPEC of a DictFunId can end up w/ gratuitous - -- TyVar(Templates) in the i/face; only a problem - -- if -fshow-pragma-name-errs; but we can do without the pain. - -- A HACK in any case (WDP 94/05/02) - = naughty_DictFunId dfun - -unfoldingUnfriendlyId d@(Id _ _ dfun@(DictFunId _ t _ _) _ _) - = naughty_DictFunId dfun -- similar deal... - -unfoldingUnfriendlyId other_id = False -- is friendly in all other cases - -naughty_DictFunId :: IdDetails -> Bool - -- True <=> has a TyVar(Template) in the "type" part of its "name" - -naughty_DictFunId (DictFunId _ _ False _) = False -- came from outside; must be OK -naughty_DictFunId (DictFunId _ ty _ _) - = not (isGroundTy ty) --} +unfoldingUnfriendlyId id = not (externallyVisibleId id) \end{code} @externallyVisibleId@: is it true that another module might be -able to ``see'' this Id? +able to ``see'' this Id in a code generation sense. That +is, another .o file might refer to this Id. -We need the @toplevelishId@ check as well as @isExported@ for when we -compile instance declarations in the prelude. @DictFunIds@ are -``exported'' if either their class or tycon is exported, but, in -compiling the prelude, the compiler may not recognise that as true. +In tidyCorePgm (SimplCore.lhs) we carefully set each top level thing's +local-ness precisely so that the test here would be easy \begin{code} externallyVisibleId :: Id -> Bool - -externallyVisibleId id@(Id _ _ details _ _) - = if isLocallyDefined id then - toplevelishId id && isExported id && not (weird_datacon details) - else - not (weird_tuplecon details) - -- if visible here, it must be visible elsewhere, too. - where - -- If it's a DataCon, it's not enough to know it (meaning - -- its TyCon) is exported; we need to know that it might - -- be visible outside. Consider: - -- - -- data Foo a = Mumble | BigFoo a WeirdLocalType - -- - -- We can't tell the outside world *anything* about Foo, because - -- of WeirdLocalType; but we need to know this when asked if - -- "Mumble" is externally visible... - -{- LATER: if at all: - weird_datacon (DataConId _ _ _ _ _ _ _ tycon) - = maybeToBool (maybePurelyLocalTyCon tycon) --} - weird_datacon not_a_datacon_therefore_not_weird = False - - weird_tuplecon (TupleConId _ arity) - = arity > 32 -- sigh || isBigTupleTyCon tycon -- generated *purely* for local use - weird_tuplecon _ = False -\end{code} - -\begin{code} -idWantsToBeINLINEd :: Id -> Bool - -idWantsToBeINLINEd (Id _ _ _ IWantToBeINLINEd _) = True -idWantsToBeINLINEd _ = False -\end{code} - -For @unlocaliseId@: See the brief commentary in -\tr{simplStg/SimplStg.lhs}. - -\begin{code} -{-LATER: -unlocaliseId :: FAST_STRING{-modulename-} -> Id -> Maybe Id - -unlocaliseId mod (Id u ty info (TopLevId fn)) - = Just (Id u ty info (TopLevId (unlocaliseFullName fn))) - -unlocaliseId mod (Id u ty info (LocalId sn no_ftvs)) - = --false?: ASSERT(no_ftvs) - let - full_name = unlocaliseShortName mod u sn - in - Just (Id u ty info (TopLevId full_name)) - -unlocaliseId mod (Id u ty info (SysLocalId sn no_ftvs)) - = --false?: on PreludeGlaST: ASSERT(no_ftvs) - let - full_name = unlocaliseShortName mod u sn - in - Just (Id u ty info (TopLevId full_name)) - -unlocaliseId mod (Id u ty info (SpecId unspec ty_maybes no_ftvs)) - = case unlocalise_parent mod u unspec of - Nothing -> Nothing - Just xx -> Just (Id u ty info (SpecId xx ty_maybes no_ftvs)) - -unlocaliseId mod (Id u ty info (WorkerId unwrkr)) - = case unlocalise_parent mod u unwrkr of - Nothing -> Nothing - Just xx -> Just (Id u ty info (WorkerId xx)) - -unlocaliseId mod (Id u ty info (InstId name no_ftvs)) - = Just (Id u ty info (TopLevId full_name)) - -- type might be wrong, but it hardly matters - -- at this stage (just before printing C) ToDo - where - name = getLocalName name - full_name = mkFullName mod name InventedInThisModule ExportAll mkGeneratedSrcLoc - -unlocaliseId mod other_id = Nothing - --------------------- --- we have to be Very Careful for workers/specs of --- local functions! - -unlocalise_parent mod uniq (Id _ ty info (LocalId sn no_ftvs)) - = --false?: ASSERT(no_ftvs) - let - full_name = unlocaliseShortName mod uniq sn - in - Just (Id uniq ty info (TopLevId full_name)) - -unlocalise_parent mod uniq (Id _ ty info (SysLocalId sn no_ftvs)) - = --false?: ASSERT(no_ftvs) - let - full_name = unlocaliseShortName mod uniq sn - in - Just (Id uniq ty info (TopLevId full_name)) - -unlocalise_parent mod uniq other_id = unlocaliseId mod other_id - -- we're OK otherwise --} +externallyVisibleId id@(Id _ name _ _ _ _) = not (isLocalName name) + -- not local => global => externally visible \end{code} CLAIM (not ASSERTed) for @applyTypeEnvToId@ and @applySubstToId@: @@ -918,7 +679,7 @@ type TypeEnv = TyVarEnv Type applyTypeEnvToId :: TypeEnv -> Id -> Id -applyTypeEnvToId type_env id@(Id _ ty _ _ _) +applyTypeEnvToId type_env id@(Id _ _ ty _ _ _) | idHasNoFreeTyVars id = id | otherwise @@ -928,15 +689,13 @@ applyTypeEnvToId type_env id@(Id _ ty _ _ _) \end{code} \begin{code} -apply_to_Id :: (Type -> Type) - -> Id - -> Id +apply_to_Id :: (Type -> Type) -> Id -> Id -apply_to_Id ty_fn (Id u ty details prag info) +apply_to_Id ty_fn (Id u n ty details prag info) = let new_ty = ty_fn ty in - Id u new_ty (apply_to_details details) prag (apply_to_IdInfo ty_fn info) + Id u n new_ty (apply_to_details details) prag (apply_to_IdInfo ty_fn info) where apply_to_details (SpecId unspec ty_maybes no_ftvs) = let @@ -968,14 +727,14 @@ with pointers to the substitution: it {\em must} be single-threaded. {-LATER: applySubstToId :: Subst -> Id -> (Subst, Id) -applySubstToId subst id@(Id u ty info details) +applySubstToId subst id@(Id u n ty info details) -- *cannot* have a "idHasNoFreeTyVars" get-out clause -- because, in the typechecker, we are still -- *concocting* the types. = case (applySubstToTy subst ty) of { (s2, new_ty) -> case (applySubstToIdInfo s2 info) of { (s3, new_info) -> case (apply_to_details s3 new_ty details) of { (s4, new_details) -> - (s4, Id u new_ty new_info new_details) }}} + (s4, Id u n new_ty new_info new_details) }}} where apply_to_details subst _ (InstId inst no_ftvs) = case (applySubstToInst subst inst) of { (s2, new_inst) -> @@ -1000,104 +759,6 @@ applySubstToId subst id@(Id u ty info details) -} \end{code} -\begin{code} -getIdNamePieces :: Bool {-show Uniques-} -> GenId ty -> [FAST_STRING] - -getIdNamePieces show_uniqs id - = get (unsafeGenId2Id id) - where - get (Id u _ details _ _) - = case details of - DataConId n _ _ _ _ _ _ _ -> - case (nameOrigName n) of { (mod, name) -> - if isPreludeDefinedName n then [name] else [mod, name] } - - TupleConId n _ -> [snd (nameOrigName n)] - - RecordSelId lbl -> panic "getIdNamePieces:RecordSelId" - - ImportedId n -> get_fullname_pieces n - PreludeId n -> get_fullname_pieces n - TopLevId n -> get_fullname_pieces n - - SuperDictSelId c sc -> - case (getOrigName c) of { (c_mod, c_name) -> - case (getOrigName sc) of { (sc_mod, sc_name) -> - let - c_bits = if isPreludeDefined c - then [c_name] - else [c_mod, c_name] - - sc_bits= if isPreludeDefined sc - then [sc_name] - else [sc_mod, sc_name] - in - [SLIT("sdsel")] ++ c_bits ++ sc_bits }} - - MethodSelId clas op -> - case (getOrigName clas) of { (c_mod, c_name) -> - case (getClassOpString op) of { op_name -> - if isPreludeDefined clas - then [op_name] - else [c_mod, c_name, op_name] - } } - - DefaultMethodId clas op _ -> - case (getOrigName clas) of { (c_mod, c_name) -> - case (getClassOpString op) of { op_name -> - if isPreludeDefined clas - then [SLIT("defm"), op_name] - else [SLIT("defm"), c_mod, c_name, op_name] }} - - DictFunId c ty _ _ -> - case (getOrigName c) of { (c_mod, c_name) -> - let - c_bits = if isPreludeDefined c - then [c_name] - else [c_mod, c_name] - - ty_bits = getTypeString ty - in - [SLIT("dfun")] ++ c_bits ++ ty_bits } - - ConstMethodId c ty o _ _ -> - case (getOrigName c) of { (c_mod, c_name) -> - case (getTypeString ty) of { ty_bits -> - case (getClassOpString o) of { o_name -> - case (if isPreludeDefined c - then [c_name] - else [c_mod, c_name]) of { c_bits -> - [SLIT("const")] ++ c_bits ++ ty_bits ++ [o_name] }}}} - - -- if the unspecialised equiv is "top-level", - -- the name must be concocted from its name and the - -- names of the types to which specialised... - - SpecId unspec ty_maybes _ -> - get unspec ++ (if not (toplevelishId unspec) - then [showUnique u] - else concat (map typeMaybeString ty_maybes)) - - WorkerId unwrkr -> - get unwrkr ++ (if not (toplevelishId unwrkr) - then [showUnique u] - else [SLIT("wrk")]) - - LocalId n _ -> let local = getLocalName n in - if show_uniqs then [local, showUnique u] else [local] - InstId n _ -> [getLocalName n, showUnique u] - SysLocalId n _ -> [getLocalName n, showUnique u] - SpecPragmaId n _ _ -> [getLocalName n, showUnique u] - -get_fullname_pieces :: Name -> [FAST_STRING] -get_fullname_pieces n - = BIND (nameOrigName n) _TO_ (mod, name) -> - if isPreludeDefinedName n - then [name] - else [mod, name] - BEND -\end{code} - %************************************************************************ %* * \subsection[Id-type-funs]{Type-related @Id@ functions} @@ -1107,7 +768,7 @@ get_fullname_pieces n \begin{code} idType :: GenId ty -> ty -idType (Id _ ty _ _ _) = ty +idType (Id _ _ ty _ _ _) = ty \end{code} \begin{code} @@ -1123,14 +784,6 @@ getMentionedTyConsAndClassesFromId id idPrimRep i = typePrimRep (idType i) \end{code} -\begin{code} -{-LATER: -getInstIdModule (Id _ _ _ (DictFunId _ _ _ mod)) = mod -getInstIdModule (Id _ _ _ (ConstMethodId _ _ _ _ mod)) = mod -getInstIdModule other = panic "Id:getInstIdModule" --} -\end{code} - %************************************************************************ %* * \subsection[Id-overloading]{Functions related to overloading} @@ -1138,19 +791,46 @@ getInstIdModule other = panic "Id:getInstIdModule" %************************************************************************ \begin{code} -mkSuperDictSelId u c sc ty info = Id u ty (SuperDictSelId c sc) NoPragmaInfo info -mkMethodSelId u c op ty info = Id u ty (MethodSelId c op) NoPragmaInfo info -mkDefaultMethodId u c op gen ty info = Id u ty (DefaultMethodId c op gen) NoPragmaInfo info - -mkDictFunId u c ity full_ty from_here mod info - = Id u full_ty (DictFunId c ity from_here mod) NoPragmaInfo info +mkSuperDictSelId u clas sc ty + = addStandardIdInfo $ + Id u name ty details NoPragmaInfo noIdInfo + where + name = mkCompoundName name_fn u (getName clas) + details = SuperDictSelId clas sc + name_fn clas_str = SLIT("scsel_") _APPEND_ clas_str _APPEND_ mod _APPEND_ occNameString occ + (mod,occ) = modAndOcc sc + + -- For method selectors the clean thing to do is + -- to give the method selector the same name as the class op itself. +mkMethodSelId op_name rec_c op ty + = addStandardIdInfo $ + Id (uniqueOf op_name) op_name ty (MethodSelId rec_c op) NoPragmaInfo noIdInfo + +mkDefaultMethodId dm_name rec_c op gen ty + = Id (uniqueOf dm_name) dm_name ty (DefaultMethodId rec_c op gen) NoPragmaInfo noIdInfo + +mkDictFunId dfun_name full_ty clas ity + = Id (nameUnique dfun_name) dfun_name full_ty details NoPragmaInfo noIdInfo + where + details = DictFunId clas ity -mkConstMethodId u c op ity full_ty from_here mod info - = Id u full_ty (ConstMethodId c ity op from_here mod) NoPragmaInfo info +mkConstMethodId uniq clas op ity full_ty from_here locn mod info + = Id uniq name full_ty details NoPragmaInfo info + where + name = mkInstDeclName uniq mod (VarOcc occ_name) locn from_here + details = ConstMethodId clas ity op mod + occ_name = classOpString op _APPEND_ + SLIT("_cm_") _APPEND_ renum_type_string full_ty ity -mkWorkerId u unwrkr ty info = Id u ty (WorkerId unwrkr) NoPragmaInfo info +mkWorkerId u unwrkr ty info + = Id u name ty details NoPragmaInfo info + where + name = mkCompoundName name_fn u (getName unwrkr) + details = WorkerId unwrkr + name_fn wkr_str = SLIT("$w") _APPEND_ wkr_str -mkInstId uniq ty name = Id uniq ty (InstId name (no_free_tvs ty)) NoPragmaInfo noIdInfo +mkInstId u ty name + = Id u name ty (InstId (no_free_tvs ty)) NoPragmaInfo noIdInfo {-LATER: getConstMethodId clas op ty @@ -1161,14 +841,22 @@ getConstMethodId clas op ty in case (lookupConstMethodId (getIdSpecialisation sel_id) ty) of Just xx -> xx - Nothing -> pprError "ERROR: getConstMethodId:" (ppAboves [ - ppCat [ppr PprDebug ty, ppr PprDebug ops, ppr PprDebug op_ids, + Nothing -> pprError "ERROR: getConstMethodId:" (vcat [ + hsep [ppr PprDebug ty, ppr PprDebug ops, ppr PprDebug op_ids, ppr PprDebug sel_id], - ppStr "(This can arise if an interface pragma refers to an instance", - ppStr "but there is no imported interface which *defines* that instance.", - ppStr "The info above, however ugly, should indicate what else you need to import." + text "(This can arise if an interface pragma refers to an instance", + text "but there is no imported interface which *defines* that instance.", + text "The info above, however ugly, should indicate what else you need to import." ]) -} + + +renum_type_string full_ty ity + = initNmbr ( + nmbrType full_ty `thenNmbr` \ _ -> -- so all the tyvars get added to renumbering... + nmbrType ity `thenNmbr` \ rn_ity -> + returnNmbr (getTypeString rn_ity) + ) \end{code} %************************************************************************ @@ -1178,16 +866,17 @@ getConstMethodId clas op ty %************************************************************************ \begin{code} -mkImported n ty info = Id (nameUnique n) ty (ImportedId n) NoPragmaInfo info -mkPreludeId n ty info = Id (nameUnique n) ty (PreludeId n) NoPragmaInfo info +mkImported n ty info = Id (nameUnique n) n ty ImportedId NoPragmaInfo info -{-LATER: -updateIdType :: Id -> Type -> Id -updateIdType (Id u _ info details) ty = Id u ty info details --} +mkPrimitiveId n ty primop + = addStandardIdInfo $ + Id (nameUnique n) n ty (PrimitiveId primop) IMustBeINLINEd noIdInfo + -- The pragma @IMustBeINLINEd@ says that this Id absolutely must be inlined. + -- It's only true for primitives, because we don't want to make a closure for each of them. \end{code} \begin{code} + type MyTy a b = GenType (GenTyVar a) b type MyId a b = GenId (MyTy a b) @@ -1195,23 +884,18 @@ no_free_tvs ty = isEmptyTyVarSet (tyVarsOfType ty) -- SysLocal: for an Id being created by the compiler out of thin air... -- UserLocal: an Id with a name the user might recognize... -mkSysLocal, mkUserLocal :: FAST_STRING -> Unique -> MyTy a b -> SrcLoc -> MyId a b +mkSysLocal :: FAST_STRING -> Unique -> MyTy a b -> SrcLoc -> MyId a b +mkUserLocal :: OccName -> Unique -> MyTy a b -> SrcLoc -> MyId a b mkSysLocal str uniq ty loc - = Id uniq ty (SysLocalId (mkLocalName uniq str loc) (no_free_tvs ty)) NoPragmaInfo noIdInfo + = Id uniq (mkSysLocalName uniq str loc) ty (SysLocalId (no_free_tvs ty)) NoPragmaInfo noIdInfo -mkUserLocal str uniq ty loc - = Id uniq ty (LocalId (mkLocalName uniq str loc) (no_free_tvs ty)) NoPragmaInfo noIdInfo +mkUserLocal occ uniq ty loc + = Id uniq (mkLocalName uniq occ loc) ty (LocalId (no_free_tvs ty)) NoPragmaInfo noIdInfo --- mkUserId builds a local or top-level Id, depending on the name given mkUserId :: Name -> MyTy a b -> PragmaInfo -> MyId a b mkUserId name ty pragma_info - | isLocalName name - = Id (nameUnique name) ty (LocalId name (no_free_tvs ty)) pragma_info noIdInfo - | otherwise - = Id (nameUnique name) ty - (if isLocallyDefinedName name then TopLevId name else ImportedId name) - pragma_info noIdInfo + = Id (nameUnique name) name ty (LocalId (no_free_tvs ty)) pragma_info noIdInfo \end{code} @@ -1219,37 +903,45 @@ mkUserId name ty pragma_info {-LATER: -- for a SpecPragmaId being created by the compiler out of thin air... -mkSpecPragmaId :: FAST_STRING -> Unique -> Type -> Maybe Id -> SrcLoc -> Id +mkSpecPragmaId :: OccName -> Unique -> Type -> Maybe Id -> SrcLoc -> Id mkSpecPragmaId str uniq ty specid loc - = Id uniq ty noIdInfo (SpecPragmaId (mkShortName str loc) specid (no_free_tvs ty)) + = Id uniq (mkShortName str loc) ty noIdInfo (SpecPragmaId specid (no_free_tvs ty)) -- for new SpecId mkSpecId u unspec ty_maybes ty info = ASSERT(not (maybeToBool (isSpecId_maybe unspec))) - Id u ty info (SpecId unspec ty_maybes (no_free_tvs ty)) + Id u n ty info (SpecId unspec ty_maybes (no_free_tvs ty)) -- Specialised version of constructor: only used in STG and code generation -- Note: The specialsied Id has the same unique as the unspeced Id -mkSameSpecCon ty_maybes unspec@(Id u ty info details) +mkSameSpecCon ty_maybes unspec@(Id u n ty info details) = ASSERT(isDataCon unspec) ASSERT(not (maybeToBool (isSpecId_maybe unspec))) - Id u new_ty info (SpecId unspec ty_maybes (no_free_tvs new_ty)) + Id u n new_ty info (SpecId unspec ty_maybes (no_free_tvs new_ty)) where new_ty = specialiseTy ty ty_maybes 0 localiseId :: Id -> Id -localiseId id@(Id u ty info details) - = Id u ty info (LocalId (mkShortName name loc) (no_free_tvs ty)) +localiseId id@(Id u n ty info details) + = Id u (mkShortName name loc) ty info (LocalId (no_free_tvs ty)) where name = getOccName id loc = getSrcLoc id -} +-- See notes with setNameVisibility (Name.lhs) +setIdVisibility :: Module -> Id -> Id +setIdVisibility mod (Id uniq name ty details prag info) + = Id uniq (setNameVisibility mod name) ty details prag info + mkIdWithNewUniq :: Id -> Unique -> Id +mkIdWithNewUniq (Id _ n ty details prag info) u + = Id u (changeUnique n u) ty details prag info -mkIdWithNewUniq (Id _ ty details prag info) uniq - = Id uniq ty details prag info +mkIdWithNewName :: Id -> Name -> Id +mkIdWithNewName (Id _ _ ty details prag info) new_name + = Id (uniqueOf new_name) new_name ty details prag info \end{code} Make some local @Ids@ for a template @CoreExpr@. These have bogus @@ -1267,18 +959,18 @@ mkTemplateLocals tys getIdInfo :: GenId ty -> IdInfo getPragmaInfo :: GenId ty -> PragmaInfo -getIdInfo (Id _ _ _ _ info) = info -getPragmaInfo (Id _ _ _ info _) = info +getIdInfo (Id _ _ _ _ _ info) = info +getPragmaInfo (Id _ _ _ _ info _) = info -{-LATER: replaceIdInfo :: Id -> IdInfo -> Id -replaceIdInfo (Id u ty _ details) info = Id u ty info details +replaceIdInfo (Id u n ty details pinfo _) info = Id u n ty details pinfo info +{-LATER: selectIdInfoForSpecId :: Id -> IdInfo selectIdInfoForSpecId unspec = ASSERT(not (maybeToBool (isSpecId_maybe unspec))) - noIdInfo `addInfo_UF` getIdUnfolding unspec + noIdInfo `addUnfoldInfo` getIdUnfolding unspec -} \end{code} @@ -1294,18 +986,13 @@ besides the code-generator need arity info!) \begin{code} getIdArity :: Id -> ArityInfo -getIdArity (Id _ _ _ _ id_info) = getInfo id_info +getIdArity id@(Id _ _ _ _ _ id_info) + = --ASSERT( not (isDataCon id)) + arityInfo id_info -dataConArity :: DataCon -> Int -dataConArity id@(Id _ _ _ _ id_info) - = ASSERT(isDataCon id) - case (arityMaybe (getInfo id_info)) of - Nothing -> pprPanic "dataConArity:Nothing:" (pprId PprDebug id) - Just i -> i - -addIdArity :: Id -> Int -> Id -addIdArity (Id u ty details pinfo info) arity - = Id u ty details pinfo (info `addInfo` (mkArityInfo arity)) +addIdArity :: Id -> ArityInfo -> Id +addIdArity (Id u n ty details pinfo info) arity + = Id u n ty details pinfo (info `addArityInfo` arity) \end{code} %************************************************************************ @@ -1317,171 +1004,114 @@ addIdArity (Id u ty details pinfo info) arity \begin{code} mkDataCon :: Name -> [StrictnessMark] -> [FieldLabel] - -> [TyVar] -> ThetaType -> [TauType] -> TyCon ---ToDo: -> SpecEnv + -> [TyVar] -> ThetaType + -> [TyVar] -> ThetaType + -> [TauType] -> TyCon -> Id -- can get the tag and all the pieces of the type from the Type -mkDataCon n stricts fields tvs ctxt args_tys tycon +mkDataCon n stricts fields tvs ctxt con_tvs con_ctxt args_tys tycon = ASSERT(length stricts == length args_tys) - data_con + addStandardIdInfo data_con where -- NB: data_con self-recursion; should be OK as tags are not -- looked at until late in the game. data_con = Id (nameUnique n) - type_of_constructor - (DataConId n data_con_tag stricts fields tvs ctxt args_tys tycon) - NoPragmaInfo - datacon_info - - data_con_tag = position_within fIRST_TAG data_con_family + n + data_con_ty + (DataConId data_con_tag stricts fields tvs ctxt con_tvs con_ctxt args_tys tycon) + IWantToBeINLINEd -- Always inline constructors if possible + noIdInfo + data_con_tag = assoc "mkDataCon" (data_con_family `zip` [fIRST_TAG..]) data_con data_con_family = tyConDataCons tycon - position_within :: Int -> [Id] -> Int - - position_within acc (c:cs) - = if c == data_con then acc else position_within (acc+1) cs -#ifdef DEBUG - position_within acc [] - = panic "mkDataCon: con not found in family" -#endif - - type_of_constructor - = mkSigmaTy tvs ctxt + data_con_ty + = mkSigmaTy (tvs++con_tvs) (ctxt++con_ctxt) (mkFunTys args_tys (applyTyCon tycon (mkTyVarTys tvs))) - datacon_info = noIdInfo `addInfo_UF` unfolding - `addInfo` mkArityInfo arity ---ToDo: `addInfo` specenv - - arity = length args_tys - - unfolding - = noInfo_UF -{- LATER: - = -- if arity == 0 - -- then noIdInfo - -- else -- do some business... - let - (tyvars, dict_vars, vars) = mk_uf_bits tvs ctxt args_tys tycon - tyvar_tys = mkTyVarTys tyvars - in - BIND (Con data_con tyvar_tys [VarArg v | v <- vars]) _TO_ plain_Con -> - - mkUnfolding EssentialUnfolding -- for data constructors - (mkLam tyvars (dict_vars ++ vars) plain_Con) - BEND - - mk_uf_bits tvs ctxt arg_tys tycon - = let - (inst_env, tyvars, tyvar_tys) - = instantiateTyVarTemplates tvs - (map uniqueOf tvs) - in - -- the "context" and "arg_tys" have TyVarTemplates in them, so - -- we instantiate those types to have the right TyVars in them - -- instead. - BIND (map (instantiateTauTy inst_env) (map ctxt_ty ctxt)) - _TO_ inst_dict_tys -> - BIND (map (instantiateTauTy inst_env) arg_tys) _TO_ inst_arg_tys -> - - -- We can only have **ONE** call to mkTemplateLocals here; - -- otherwise, we get two blobs of locals w/ mixed-up Uniques - -- (Mega-Sigh) [ToDo] - BIND (mkTemplateLocals (inst_dict_tys ++ inst_arg_tys)) _TO_ all_vars -> - - BIND (splitAt (length ctxt) all_vars) _TO_ (dict_vars, vars) -> - - (tyvars, dict_vars, vars) - BEND BEND BEND BEND - where - -- these are really dubious Types, but they are only to make the - -- binders for the lambdas for tossed-away dicts. - ctxt_ty (clas, ty) = mkDictTy clas ty --} -\end{code} - -\begin{code} -mkTupleCon :: Arity -> Id -mkTupleCon arity - = Id unique ty (TupleConId n arity) NoPragmaInfo tuplecon_info +mkTupleCon :: Arity -> Name -> Type -> Id +mkTupleCon arity name ty + = addStandardIdInfo tuple_id where - n = panic "mkTupleCon: its Name (Id)" - unique = mkTupleDataConUnique arity - ty = mkSigmaTy tyvars [] - (mkFunTys tyvar_tys (applyTyCon tycon tyvar_tys)) - tycon = mkTupleTyCon arity - tyvars = take arity alphaTyVars - tyvar_tys = mkTyVarTys tyvars - - tuplecon_info - = noIdInfo `addInfo_UF` unfolding - `addInfo` mkArityInfo arity ---LATER:? `addInfo` panic "Id:mkTupleCon:pcGenerateTupleSpecs arity ty" + tuple_id = Id (nameUnique name) name ty + (TupleConId arity) + IWantToBeINLINEd -- Always inline constructors if possible + noIdInfo - unfolding - = noInfo_UF -{- LATER: - = -- if arity == 0 - -- then noIdInfo - -- else -- do some business... - let - (tyvars, dict_vars, vars) = mk_uf_bits arity - tyvar_tys = mkTyVarTys tyvars - in - BIND (Con data_con tyvar_tys [VarArg v | v <- vars]) _TO_ plain_Con -> +fIRST_TAG :: ConTag +fIRST_TAG = 1 -- Tags allocated from here for real constructors +\end{code} - mkUnfolding - EssentialUnfolding -- data constructors - (mkLam tyvars (dict_vars ++ vars) plain_Con) - BEND +dataConNumFields gives the number of actual fields in the +{\em representation} of the data constructor. This may be more than appear +in the source code; the extra ones are the existentially quantified +dictionaries - mk_uf_bits arity - = BIND (mkTemplateLocals tyvar_tys) _TO_ vars -> - (tyvars, [], vars) - BEND - where - tyvar_tmpls = take arity alphaTyVars - (_, tyvars, tyvar_tys) = instantiateTyVarTemplates tyvar_tmpls (map uniqueOf tyvar_tmpls) --} +\begin{code} +dataConNumFields id + = ASSERT(isDataCon id) + case (dataConSig id) of { (_, _, _, con_theta, arg_tys, _) -> + length con_theta + length arg_tys } -fIRST_TAG :: ConTag -fIRST_TAG = 1 -- Tags allocated from here for real constructors +isNullaryDataCon con = dataConNumFields con == 0 -- function of convenience \end{code} + \begin{code} dataConTag :: DataCon -> ConTag -- will panic if not a DataCon -dataConTag (Id _ _ (DataConId _ tag _ _ _ _ _ _) _ _) = tag -dataConTag (Id _ _ (TupleConId _ _) _ _) = fIRST_TAG -dataConTag (Id _ _ (SpecId unspec _ _) _ _) = dataConTag unspec +dataConTag (Id _ _ _ (DataConId tag _ _ _ _ _ _ _ _) _ _) = tag +dataConTag (Id _ _ _ (TupleConId _) _ _) = fIRST_TAG +dataConTag (Id _ _ _ (SpecId unspec _ _) _ _) = dataConTag unspec dataConTyCon :: DataCon -> TyCon -- will panic if not a DataCon -dataConTyCon (Id _ _ (DataConId _ _ _ _ _ _ _ tycon) _ _) = tycon -dataConTyCon (Id _ _ (TupleConId _ a) _ _) = mkTupleTyCon a +dataConTyCon (Id _ _ _ (DataConId _ _ _ _ _ _ _ _ tycon) _ _) = tycon +dataConTyCon (Id _ _ _ (TupleConId a) _ _) = tupleTyCon a -dataConSig :: DataCon -> ([TyVar], ThetaType, [TauType], TyCon) +dataConSig :: DataCon -> ([TyVar], ThetaType, [TyVar], ThetaType, [TauType], TyCon) -- will panic if not a DataCon -dataConSig (Id _ _ (DataConId _ _ _ _ tyvars theta_ty arg_tys tycon) _ _) - = (tyvars, theta_ty, arg_tys, tycon) +dataConSig (Id _ _ _ (DataConId _ _ _ tyvars theta con_tyvars con_theta arg_tys tycon) _ _) + = (tyvars, theta, con_tyvars, con_theta, arg_tys, tycon) -dataConSig (Id _ _ (TupleConId _ arity) _ _) - = (tyvars, [], tyvar_tys, mkTupleTyCon arity) +dataConSig (Id _ _ _ (TupleConId arity) _ _) + = (tyvars, [], [], [], tyvar_tys, tupleTyCon arity) where tyvars = take arity alphaTyVars tyvar_tys = mkTyVarTys tyvars + +-- dataConRepType returns the type of the representation of a contructor +-- This may differ from the type of the contructor Id itself for two reasons: +-- a) the constructor Id may be overloaded, but the dictionary isn't stored +-- b) the constructor may store an unboxed version of a strict field. +-- Here's an example illustrating both: +-- data Ord a => T a = MkT Int! a +-- Here +-- T :: Ord a => Int -> a -> T a +-- but the rep type is +-- Trep :: Int# -> a -> T a +-- Actually, the unboxed part isn't implemented yet! + +dataConRepType :: GenId (GenType tv u) -> GenType tv u +dataConRepType con + = mkForAllTys tyvars tau + where + (tyvars, theta, tau) = splitSigmaTy (idType con) + dataConFieldLabels :: DataCon -> [FieldLabel] -dataConFieldLabels (Id _ _ (DataConId _ _ _ fields _ _ _ _) _ _) = fields -dataConFieldLabels (Id _ _ (TupleConId _ _) _ _) = [] +dataConFieldLabels (Id _ _ _ (DataConId _ _ fields _ _ _ _ _ _) _ _) = fields +dataConFieldLabels (Id _ _ _ (TupleConId _) _ _) = [] dataConStrictMarks :: DataCon -> [StrictnessMark] -dataConStrictMarks (Id _ _ (DataConId _ _ stricts _ _ _ _ _) _ _) = stricts -dataConStrictMarks (Id _ _ (TupleConId _ arity) _ _) - = take arity (repeat NotMarkedStrict) +dataConStrictMarks (Id _ _ _ (DataConId _ stricts _ _ _ _ _ _ _) _ _) = stricts +dataConStrictMarks (Id _ _ _ (TupleConId arity) _ _) + = nOfThem arity NotMarkedStrict + +dataConRawArgTys :: DataCon -> [TauType] -- a function of convenience +dataConRawArgTys con = case (dataConSig con) of { (_,_, _, _, arg_tys,_) -> arg_tys } dataConArgTys :: DataCon -> [Type] -- Instantiated at these types @@ -1489,13 +1119,15 @@ dataConArgTys :: DataCon dataConArgTys con_id inst_tys = map (instantiateTy tenv) arg_tys where - (tyvars, _, arg_tys, _) = dataConSig con_id - tenv = tyvars `zipEqual` inst_tys + (tyvars, _, _, _, arg_tys, _) = dataConSig con_id + tenv = zipEqual "dataConArgTys" tyvars inst_tys \end{code} \begin{code} mkRecordSelId field_label selector_ty - = Id (nameUnique name) + = addStandardIdInfo $ -- Record selectors have a standard unfolding + Id (nameUnique name) + name selector_ty (RecordSelId field_label) NoPragmaInfo @@ -1504,7 +1136,10 @@ mkRecordSelId field_label selector_ty name = fieldLabelName field_label recordSelectorFieldLabel :: Id -> FieldLabel -recordSelectorFieldLabel (Id _ _ (RecordSelId lbl) _ _) = lbl +recordSelectorFieldLabel (Id _ _ _ (RecordSelId lbl) _ _) = lbl + +isRecordSelector (Id _ _ _ (RecordSelId lbl) _ _) = True +isRecordSelector other = False \end{code} @@ -1526,51 +1161,50 @@ Notice the ``big lambdas'' and type arguments to @Con@---we are producing %* * %************************************************************************ -@getIdUnfolding@ takes a @Id@ (we are discussing the @DataCon@ case) -and generates an @UnfoldingDetails@ for its unfolding. The @Ids@ and -@TyVars@ don't really have to be new, because we are only producing a -template. +\begin{code} +getIdUnfolding :: Id -> Unfolding + +getIdUnfolding (Id _ _ _ _ _ info) = unfoldInfo info -ToDo: what if @DataConId@'s type has a context (haven't thought about it ---WDP)? +addIdUnfolding :: Id -> Unfolding -> Id +addIdUnfolding id@(Id u n ty details prag info) unfolding + = Id u n ty details prag (info `addUnfoldInfo` unfolding) +\end{code} -Note: @getDataConUnfolding@ is a ``poor man's'' version---it is NOT -EXPORTED. It just returns the binders (@TyVars@ and @Ids@) [in the -example above: a, b, and x, y, z], which is enough (in the important -\tr{DsExpr} case). (The middle set of @Ids@ is binders for any -dictionaries, in the even of an overloaded data-constructor---none at -present.) +The inline pragma tells us to be very keen to inline this Id, but it's still +OK not to if optimisation is switched off. \begin{code} -getIdUnfolding :: Id -> UnfoldingDetails +getInlinePragma :: Id -> PragmaInfo +getInlinePragma (Id _ _ _ _ prag _) = prag -getIdUnfolding (Id _ _ _ _ info) = getInfo_UF info +idWantsToBeINLINEd :: Id -> Bool -{-LATER: -addIdUnfolding :: Id -> UnfoldingDetails -> Id -addIdUnfolding id@(Id u ty info details) unfold_details - = ASSERT( - case (isLocallyDefined id, unfold_details) of - (_, NoUnfoldingDetails) -> True - (True, IWantToBeINLINEd _) -> True - (False, IWantToBeINLINEd _) -> False -- v bad - (False, _) -> True - _ -> False -- v bad - ) - Id u ty (info `addInfo_UF` unfold_details) details --} +idWantsToBeINLINEd (Id _ _ _ _ IWantToBeINLINEd _) = True +idWantsToBeINLINEd (Id _ _ _ _ IMustBeINLINEd _) = True +idWantsToBeINLINEd _ = False + +idMustNotBeINLINEd (Id _ _ _ _ IMustNotBeINLINEd _) = True +idMustNotBeINLINEd _ = False + +idMustBeINLINEd (Id _ _ _ _ IMustBeINLINEd _) = True +idMustBeINLINEd _ = False + +addInlinePragma :: Id -> Id +addInlinePragma (Id u sn ty details _ info) + = Id u sn ty details IWantToBeINLINEd info + +nukeNoInlinePragma :: Id -> Id +nukeNoInlinePragma id@(Id u sn ty details IMustNotBeINLINEd info) + = Id u sn ty details NoPragmaInfo info +nukeNoInlinePragma id@(Id u sn ty details _ info) = id -- Otherwise no-op + +addNoInlinePragma :: Id -> Id +addNoInlinePragma id@(Id u sn ty details _ info) + = Id u sn ty details IMustNotBeINLINEd info \end{code} -In generating selector functions (take a dictionary, give back one -component...), we need to what out for the nothing-to-select cases (in -which case the ``selector'' is just an identity function): -\begin{verbatim} -class Eq a => Foo a { } # the superdict selector for "Eq" -class Foo a { op :: Complex b => c -> b -> a } - # the method selector for "op"; - # note local polymorphism... -\end{verbatim} %************************************************************************ %* * @@ -1580,66 +1214,63 @@ class Foo a { op :: Complex b => c -> b -> a } \begin{code} getIdDemandInfo :: Id -> DemandInfo -getIdDemandInfo (Id _ _ _ _ info) = getInfo info +getIdDemandInfo (Id _ _ _ _ _ info) = demandInfo info addIdDemandInfo :: Id -> DemandInfo -> Id -addIdDemandInfo (Id u ty details prags info) demand_info - = Id u ty details prags (info `addInfo` demand_info) +addIdDemandInfo (Id u n ty details prags info) demand_info + = Id u n ty details prags (info `addDemandInfo` demand_info) \end{code} \begin{code} getIdUpdateInfo :: Id -> UpdateInfo -getIdUpdateInfo (Id _ _ _ _ info) = getInfo info +getIdUpdateInfo (Id _ _ _ _ _ info) = updateInfo info addIdUpdateInfo :: Id -> UpdateInfo -> Id -addIdUpdateInfo (Id u ty details prags info) upd_info - = Id u ty details prags (info `addInfo` upd_info) +addIdUpdateInfo (Id u n ty details prags info) upd_info + = Id u n ty details prags (info `addUpdateInfo` upd_info) \end{code} \begin{code} {- LATER: getIdArgUsageInfo :: Id -> ArgUsageInfo -getIdArgUsageInfo (Id u ty info details) = getInfo info +getIdArgUsageInfo (Id u n ty info details) = argUsageInfo info addIdArgUsageInfo :: Id -> ArgUsageInfo -> Id -addIdArgUsageInfo (Id u ty info details) au_info - = Id u ty (info `addInfo` au_info) details +addIdArgUsageInfo (Id u n ty info details) au_info + = Id u n ty (info `addArgusageInfo` au_info) details -} \end{code} \begin{code} {- LATER: getIdFBTypeInfo :: Id -> FBTypeInfo -getIdFBTypeInfo (Id u ty info details) = getInfo info +getIdFBTypeInfo (Id u n ty info details) = fbTypeInfo info addIdFBTypeInfo :: Id -> FBTypeInfo -> Id -addIdFBTypeInfo (Id u ty info details) upd_info - = Id u ty (info `addInfo` upd_info) details +addIdFBTypeInfo (Id u n ty info details) upd_info + = Id u n ty (info `addFBTypeInfo` upd_info) details -} \end{code} \begin{code} -{- LATER: getIdSpecialisation :: Id -> SpecEnv -getIdSpecialisation (Id _ _ _ _ info) = getInfo info +getIdSpecialisation (Id _ _ _ _ _ info) = specInfo info addIdSpecialisation :: Id -> SpecEnv -> Id -addIdSpecialisation (Id u ty details prags info) spec_info - = Id u ty details prags (info `addInfo` spec_info) --} +addIdSpecialisation (Id u n ty details prags info) spec_info + = Id u n ty details prags (info `addSpecInfo` spec_info) \end{code} Strictness: we snaffle the info out of the IdInfo. \begin{code} -getIdStrictness :: Id -> StrictnessInfo - -getIdStrictness (Id _ _ _ _ info) = getInfo info +getIdStrictness :: Id -> StrictnessInfo Id -addIdStrictness :: Id -> StrictnessInfo -> Id +getIdStrictness (Id _ _ _ _ _ info) = strictnessInfo info -addIdStrictness (Id u ty details prags info) strict_info - = Id u ty details prags (info `addInfo` strict_info) +addIdStrictness :: Id -> StrictnessInfo Id -> Id +addIdStrictness (Id u n ty details prags info) strict_info + = Id u n ty details prags (info `addStrictnessInfo` strict_info) \end{code} %************************************************************************ @@ -1651,7 +1282,7 @@ addIdStrictness (Id u ty details prags info) strict_info Comparison: equality and ordering---this stuff gets {\em hammered}. \begin{code} -cmpId (Id u1 _ _ _ _) (Id u2 _ _ _ _) = cmp u1 u2 +cmpId (Id u1 _ _ _ _ _) (Id u2 _ _ _ _ _) = cmp u1 u2 -- short and very sweet \end{code} @@ -1660,15 +1291,15 @@ instance Ord3 (GenId ty) where cmp = cmpId instance Eq (GenId ty) where - a == b = case cmpId a b of { EQ_ -> True; _ -> False } - a /= b = case cmpId a b of { EQ_ -> False; _ -> True } + a == b = case (a `cmp` b) of { EQ_ -> True; _ -> False } + a /= b = case (a `cmp` b) of { EQ_ -> False; _ -> True } instance Ord (GenId ty) where - a <= b = case cmpId a b of { LT_ -> True; EQ_ -> True; GT__ -> False } - a < b = case cmpId a b of { LT_ -> True; EQ_ -> False; GT__ -> False } - a >= b = case cmpId a b of { LT_ -> False; EQ_ -> True; GT__ -> True } - a > b = case cmpId a b of { LT_ -> False; EQ_ -> False; GT__ -> True } - _tagCmp a b = case cmpId a b of { LT_ -> _LT; EQ_ -> _EQ; GT__ -> _GT } + a <= b = case (a `cmp` b) of { LT_ -> True; EQ_ -> True; GT__ -> False } + a < b = case (a `cmp` b) of { LT_ -> True; EQ_ -> False; GT__ -> False } + a >= b = case (a `cmp` b) of { LT_ -> False; EQ_ -> True; GT__ -> True } + a > b = case (a `cmp` b) of { LT_ -> False; EQ_ -> False; GT__ -> True } + _tagCmp a b = case (a `cmp` b) of { LT_ -> _LT; EQ_ -> _EQ; GT__ -> _GT } \end{code} @cmpId_withSpecDataCon@ ensures that any spectys are taken into @@ -1689,12 +1320,12 @@ cmpId_withSpecDataCon id1 id2 cmp_ids = cmpId id1 id2 eq_ids = case cmp_ids of { EQ_ -> True; other -> False } -cmpEqDataCon (Id _ _ (SpecId _ mtys1 _) _ _) (Id _ _ (SpecId _ mtys2 _) _ _) +cmpEqDataCon (Id _ _ _ (SpecId _ mtys1 _) _ _) (Id _ _ _ (SpecId _ mtys2 _) _ _) = panic# "Id.cmpEqDataCon:cmpUniTypeMaybeList mtys1 mtys2" -cmpEqDataCon _ (Id _ _ (SpecId _ _ _) _ _) = LT_ -cmpEqDataCon (Id _ _ (SpecId _ _ _) _ _) _ = GT_ -cmpEqDataCon _ _ = EQ_ +cmpEqDataCon _ (Id _ _ _ (SpecId _ _ _) _ _) = LT_ +cmpEqDataCon (Id _ _ _ (SpecId _ _ _) _ _) _ = GT_ +cmpEqDataCon _ _ = EQ_ \end{code} %************************************************************************ @@ -1712,141 +1343,33 @@ instance Outputable {-Id, i.e.:-}(GenId Type) where ppr sty id = pprId sty id showId :: PprStyle -> Id -> String -showId sty id = ppShow 80 (pprId sty id) - --- [used below] --- for DictFuns (instances) and const methods (instance code bits we --- can call directly): exported (a) if *either* the class or --- ***OUTERMOST*** tycon [arbitrary...] is exported; or (b) *both* --- class and tycon are from PreludeCore [non-std, but convenient] --- *and* the thing was defined in this module. - -instance_export_flag :: Class -> Type -> Bool -> ExportFlag - -instance_export_flag clas inst_ty from_here - = panic "Id:instance_export_flag" -{-LATER - = if instanceIsExported clas inst_ty from_here - then ExportAll - else NotExported --} +showId sty id = show (pprId sty id) \end{code} Default printing code (not used for interfaces): \begin{code} -pprId :: Outputable ty => PprStyle -> GenId ty -> Pretty +pprId :: Outputable ty => PprStyle -> GenId ty -> Doc -pprId other_sty id - = let - pieces = getIdNamePieces (case other_sty of {PprForUser -> False; _ -> True}) id - - for_code - = let - pieces_to_print -- maybe use Unique only - = if isSysLocalId id then tail pieces else pieces - in - ppIntersperse (ppPStr cSEP) (map identToC pieces_to_print) - in - case other_sty of - PprForC -> for_code - PprForAsm _ _ -> for_code - PprInterface -> ppr other_sty occur_name - PprForUser -> ppr other_sty occur_name - PprUnfolding -> qualified_name pieces - PprDebug -> qualified_name pieces - PprShowAll -> ppBesides [qualified_name pieces, - (ppCat [pp_uniq id, - ppPStr SLIT("{-"), - ppr other_sty (idType id), - ppIdInfo other_sty (unsafeGenId2Id id) True - (\x->x) nullIdEnv (getIdInfo id), - ppPStr SLIT("-}") ])] +pprId sty (Id u n _ _ prags _) + = hcat [ppr sty n, pp_prags] where - occur_name = getOccName id `appendRdr` - (if not (isSysLocalId id) - then SLIT("") - else SLIT(".") _APPEND_ (showUnique (idUnique id))) - - qualified_name pieces - = ppBeside (pp_ubxd (ppIntersperse (ppChar '.') (map ppPStr pieces))) (pp_uniq id) - - pp_uniq (Id _ _ (PreludeId _) _ _) = ppNil -- no uniq to add - pp_uniq (Id _ _ (DataConId _ _ _ _ _ _ _ _) _ _) = ppNil - pp_uniq (Id _ _ (TupleConId _ _) _ _) = ppNil - pp_uniq (Id _ _ (LocalId _ _) _ _) = ppNil -- uniq printed elsewhere - pp_uniq (Id _ _ (SysLocalId _ _) _ _) = ppNil - pp_uniq (Id _ _ (SpecPragmaId _ _ _) _ _) = ppNil - pp_uniq (Id _ _ (InstId _ _) _ _) = ppNil - pp_uniq other_id = ppBesides [ppPStr SLIT("{-"), pprUnique (idUnique other_id), ppPStr SLIT("-}")] - - -- print PprDebug Ids with # afterwards if they are of primitive type. - pp_ubxd pretty = pretty - -{- LATER: applying isPrimType restricts type - pp_ubxd pretty = if isPrimType (idType id) - then ppBeside pretty (ppChar '#') - else pretty --} + pp_prags = ifPprDebug sty (case prags of + IMustNotBeINLINEd -> text "{n}" + IWantToBeINLINEd -> text "{i}" + IMustBeINLINEd -> text "{I}" + other -> empty) + -- WDP 96/05/06: We can re-elaborate this as we go along... \end{code} \begin{code} -idUnique (Id u _ _ _ _) = u +idUnique (Id u _ _ _ _ _) = u instance Uniquable (GenId ty) where uniqueOf = idUnique instance NamedThing (GenId ty) where - getName this_id@(Id u _ details _ _) - = get details - where - get (LocalId n _) = n - get (SysLocalId n _) = n - get (SpecPragmaId n _ _)= n - get (ImportedId n) = n - get (PreludeId n) = n - get (TopLevId n) = n - get (InstId n _) = n - get (DataConId n _ _ _ _ _ _ _) = n - get (TupleConId n _) = n - get (RecordSelId l) = getName l --- get _ = pprPanic "Id.Id.NamedThing.getName:" (pprId PprDebug this_id) - -{- LATER: - get (MethodSelId c op) = case (getOrigName c) of -- ToDo; better ??? - (mod, _) -> (mod, getClassOpString op) - - get (SpecId unspec ty_maybes _) - = BIND getOrigName unspec _TO_ (mod, unspec_nm) -> - BIND specMaybeTysSuffix ty_maybes _TO_ tys_suffix -> - (mod, - unspec_nm _APPEND_ - (if not (toplevelishId unspec) - then showUnique u - else tys_suffix) - ) - BEND BEND - - get (WorkerId unwrkr) - = BIND getOrigName unwrkr _TO_ (mod, unwrkr_nm) -> - (mod, - unwrkr_nm _APPEND_ - (if not (toplevelishId unwrkr) - then showUnique u - else SLIT(".wrk")) - ) - BEND - - get other_details - -- the remaining internally-generated flavours of - -- Ids really do not have meaningful "original name" stuff, - -- but we need to make up something (usually for debugging output) - - = BIND (getIdNamePieces True this_id) _TO_ (piece1:pieces) -> - BIND [ _CONS_ '.' p | p <- pieces ] _TO_ dotted_pieces -> - (_NIL_, _CONCAT_ (piece1 : dotted_pieces)) - BEND BEND --} + getName this_id@(Id u n _ details _ _) = n \end{code} Note: The code generator doesn't carry a @UniqueSupply@, so it uses @@ -1873,7 +1396,7 @@ delManyFromIdEnv :: IdEnv a -> [GenId ty] -> IdEnv a delOneFromIdEnv :: IdEnv a -> GenId ty -> IdEnv a combineIdEnvs :: (a -> a -> a) -> IdEnv a -> IdEnv a -> IdEnv a mapIdEnv :: (a -> b) -> IdEnv a -> IdEnv b -modifyIdEnv :: IdEnv a -> (a -> a) -> GenId ty -> IdEnv a +modifyIdEnv :: (a -> a) -> IdEnv a -> GenId ty -> IdEnv a rngIdEnv :: IdEnv a -> [a] isNullIdEnv :: IdEnv a -> Bool @@ -1901,10 +1424,15 @@ lookupNoFailIdEnv env id = case (lookupIdEnv env id) of { Just xx -> xx } -- modifyIdEnv: Look up a thing in the IdEnv, then mash it with the -- modify function, and put it back. -modifyIdEnv env mangle_fn key +modifyIdEnv mangle_fn env key = case (lookupIdEnv env key) of Nothing -> env Just xx -> addOneToIdEnv env key (mangle_fn xx) + +modifyIdEnv_Directly mangle_fn env key + = case (lookupUFM_Directly env key) of + Nothing -> env + Just xx -> addToUFM_Directly env key (mangle_fn xx) \end{code} \begin{code} @@ -1935,3 +1463,91 @@ minusIdSet = minusUniqSet isEmptyIdSet = isEmptyUniqSet mkIdSet = mkUniqSet \end{code} + +\begin{code} +addId, nmbrId, nmbrDataCon :: Id -> NmbrM Id + +addId id@(Id u n ty det prag info) nenv@(NmbrEnv ui ut uu idenv tvenv uvenv) + = case (lookupUFM_Directly idenv u) of + Just xx -> trace "addId: already in map!" $ + (nenv, xx) + Nothing -> + if toplevelishId id then + trace "addId: can't add toplevelish!" $ + (nenv, id) + else -- alloc a new unique for this guy + -- and add an entry in the idenv + -- NB: *** KNOT-TYING *** + let + nenv_plus_id = NmbrEnv (incrUnique ui) ut uu + (addToUFM_Directly idenv u new_id) + tvenv uvenv + + (nenv2, new_ty) = nmbrType ty nenv_plus_id + (nenv3, new_det) = nmbr_details det nenv2 + + new_id = Id ui n new_ty new_det prag info + in + (nenv3, new_id) + +nmbrId id@(Id u n ty det prag info) nenv@(NmbrEnv ui ut uu idenv tvenv uvenv) + = case (lookupUFM_Directly idenv u) of + Just xx -> (nenv, xx) + Nothing -> + if not (toplevelishId id) then + trace "nmbrId: lookup failed" $ + (nenv, id) + else + let + (nenv2, new_ty) = nmbrType ty nenv + (nenv3, new_det) = nmbr_details det nenv2 + + new_id = Id u n new_ty new_det prag info + in + (nenv3, new_id) + + -- used when renumbering TyCons to produce data decls... +nmbrDataCon id@(Id _ _ _ (TupleConId _) _ _) nenv + = (nenv, id) -- nothing to do for tuples + +nmbrDataCon id@(Id u n ty (DataConId tag marks fields tvs theta con_tvs con_theta arg_tys tc) prag info) + nenv@(NmbrEnv ui ut uu idenv tvenv uvenv) + = case (lookupUFM_Directly idenv u) of + Just xx -> trace "nmbrDataCon: in env???\n" (nenv, xx) + Nothing -> + let + (nenv2, new_fields) = (mapNmbr nmbrField fields) nenv + (nenv3, new_arg_tys) = (mapNmbr nmbrType arg_tys) nenv2 + + new_det = DataConId tag marks new_fields (bottom "tvs") (bottom "theta") (bottom "tvs") (bottom "theta") new_arg_tys tc + new_id = Id u n (bottom "ty") new_det prag info + in + (nenv3, new_id) + where + bottom msg = panic ("nmbrDataCon"++msg) + +------------ +nmbr_details :: IdDetails -> NmbrM IdDetails + +nmbr_details (DataConId tag marks fields tvs theta con_tvs con_theta arg_tys tc) + = mapNmbr nmbrTyVar tvs `thenNmbr` \ new_tvs -> + mapNmbr nmbrTyVar con_tvs `thenNmbr` \ new_con_tvs -> + mapNmbr nmbrField fields `thenNmbr` \ new_fields -> + mapNmbr nmbr_theta theta `thenNmbr` \ new_theta -> + mapNmbr nmbr_theta con_theta `thenNmbr` \ new_con_theta -> + mapNmbr nmbrType arg_tys `thenNmbr` \ new_arg_tys -> + returnNmbr (DataConId tag marks new_fields new_tvs new_theta new_con_tvs new_con_theta new_arg_tys tc) + where + nmbr_theta (c,t) + = --nmbrClass c `thenNmbr` \ new_c -> + nmbrType t `thenNmbr` \ new_t -> + returnNmbr (c, new_t) + + -- ToDo:add more cases as needed +nmbr_details other_details = returnNmbr other_details + +------------ +nmbrField (FieldLabel n ty tag) + = nmbrType ty `thenNmbr` \ new_ty -> + returnNmbr (FieldLabel n new_ty tag) +\end{code}