X-Git-Url: http://git.megacz.com/?a=blobdiff_plain;f=ghc%2Fcompiler%2FbasicTypes%2FDemand.lhs;h=546e3a2bbb18ee8be7f093c90aafc9a4f2583253;hb=8ab22d1daf9b6054dd1d28127706a38c572b2348;hp=22b699d5da5ee72981e3aac7deb0fb1cd7881049;hpb=dcef38bab91d45b56f7cf3ceeec96303d93728bb;p=ghc-hetmet.git diff --git a/ghc/compiler/basicTypes/Demand.lhs b/ghc/compiler/basicTypes/Demand.lhs index 22b699d..546e3a2 100644 --- a/ghc/compiler/basicTypes/Demand.lhs +++ b/ghc/compiler/basicTypes/Demand.lhs @@ -1,17 +1,28 @@ % -% (c) The GRASP/AQUA Project, Glasgow University, 1992-1996 +% (c) The GRASP/AQUA Project, Glasgow University, 1992-1998 % \section[Demand]{@Demand@: the amount of demand on a value} \begin{code} -#include "HsVersions.h" +module Demand( + Demand(..), + + wwLazy, wwStrict, wwUnpackData, wwUnpackNew, wwPrim, wwEnum, + isStrict, isLazy, isPrim, + + pprDemands, seqDemand, seqDemands, + + StrictnessInfo(..), + mkStrictnessInfo, + noStrictnessInfo, + ppStrictnessInfo, seqStrictnessInfo, + isBottomingStrictness, appIsBottom, + ) where -module Demand where +#include "HsVersions.h" -import PprStyle ( PprStyle ) +import BasicTypes ( NewOrData(..) ) import Outputable -import Pretty ( Doc, text ) -import Util ( panic ) \end{code} @@ -33,9 +44,10 @@ data Demand -- (does not imply worker's existence or any -- calling-convention magic) - | WwUnpack -- Argument is strict & a single-constructor + | WwUnpack -- Argument is strict & a single-constructor type + NewOrData Bool -- True <=> wrapper unpacks it; False <=> doesn't - [Demand] -- type; its constituent parts (whose StrictInfos + [Demand] -- Its constituent parts (whose StrictInfos -- are in the list) should be passed -- as arguments to the worker. @@ -46,17 +58,26 @@ data Demand | WwEnum -- Argument is strict & an enumeration type; -- an Int# representing the tag (start counting -- at zero) should be passed to the worker. - deriving (Eq, Ord) - -- we need Eq/Ord to cross-chk update infos in interfaces + deriving( Eq ) type MaybeAbsent = Bool -- True <=> not even used -- versions that don't worry about Absence: wwLazy = WwLazy False wwStrict = WwStrict -wwUnpack xs = WwUnpack False xs +wwUnpackData xs = WwUnpack DataType False xs +wwUnpackNew x = ASSERT( isStrict x) -- Invariant + WwUnpack NewType False [x] wwPrim = WwPrim wwEnum = WwEnum + +seqDemand :: Demand -> () +seqDemand (WwLazy a) = a `seq` () +seqDemand (WwUnpack nd b ds) = nd `seq` b `seq` seqDemands ds +seqDemand other = () + +seqDemands [] = () +seqDemands (d:ds) = seqDemand d `seq` seqDemands ds \end{code} @@ -67,13 +88,18 @@ wwEnum = WwEnum %************************************************************************ \begin{code} +isLazy :: Demand -> Bool + -- Even a demand of (WwUnpack NewType _ _) is strict + -- We don't create such a thing unless the demand inside is strict +isLazy (WwLazy _) = True +isLazy _ = False + isStrict :: Demand -> Bool +isStrict d = not (isLazy d) -isStrict WwStrict = True -isStrict (WwUnpack _ _) = True -isStrict WwPrim = True -isStrict WwEnum = True -isStrict _ = False +isPrim :: Demand -> Bool +isPrim WwPrim = True +isPrim other = False \end{code} @@ -83,49 +109,101 @@ isStrict _ = False %* * %************************************************************************ + \begin{code} -#ifdef REALLY_HASKELL_1_3 -instance Read Demand where -#else -instance Text Demand where -#endif - readList str = read_em [{-acc-}] str - where - read_em acc ('L' : xs) = read_em (WwLazy False : acc) xs - read_em acc ('A' : xs) = read_em (WwLazy True : acc) xs - read_em acc ('S' : xs) = read_em (WwStrict : acc) xs - read_em acc ('P' : xs) = read_em (WwPrim : acc) xs - read_em acc ('E' : xs) = read_em (WwEnum : acc) xs - - read_em acc (')' : xs) = [(reverse acc, xs)] - read_em acc ( 'U' : '(' : xs) = do_unpack True acc xs - read_em acc ( 'u' : '(' : xs) = do_unpack False acc xs - - read_em acc rest = [(reverse acc, rest)] - - do_unpack wrapper_unpacks acc xs - = case (read_em [] xs) of - [(stuff, rest)] -> read_em (WwUnpack wrapper_unpacks stuff : acc) rest - _ -> panic ("Text.Demand:"++str++"::"++xs) - - -#ifdef REALLY_HASKELL_1_3 -instance Show Demand where -#endif - showList wrap_args rest = foldr show1 rest wrap_args - where - show1 (WwLazy False) rest = 'L' : rest - show1 (WwLazy True) rest = 'A' : rest - show1 WwStrict rest = 'S' : rest - show1 WwPrim rest = 'P' : rest - show1 WwEnum rest = 'E' : rest - show1 (WwUnpack wu args) rest = ch ++ "(" ++ showList args (')' : rest) +pprDemands demands bot = hcat (map pprDemand demands) <> pp_bot + where + pp_bot | bot = ptext SLIT("B") + | otherwise = empty + + +pprDemand (WwLazy False) = char 'L' +pprDemand (WwLazy True) = char 'A' +pprDemand WwStrict = char 'S' +pprDemand WwPrim = char 'P' +pprDemand WwEnum = char 'E' +pprDemand (WwUnpack nd wu args) = char ch <> parens (hcat (map pprDemand args)) where - ch = if wu then "U" else "u" + ch = case nd of + DataType | wu -> 'U' + | otherwise -> 'u' + NewType | wu -> 'N' + | otherwise -> 'n' instance Outputable Demand where - ppr sty si = text (showList [si] "") + ppr (WwLazy False) = empty + ppr other_demand = ptext SLIT("__D") <+> pprDemand other_demand + +instance Show Demand where + showsPrec p d = showsPrecSDoc p (ppr d) + +-- Reading demands is done in Lex.lhs \end{code} +%************************************************************************ +%* * +\subsection[strictness-IdInfo]{Strictness info about an @Id@} +%* * +%************************************************************************ + +We specify the strictness of a function by giving information about +each of the ``wrapper's'' arguments (see the description about +worker/wrapper-style transformations in the PJ/Launchbury paper on +unboxed types). + +The list of @Demands@ specifies: (a)~the strictness properties of a +function's arguments; and (b)~the type signature of that worker (if it +exists); i.e. its calling convention. + +Note that the existence of a worker function is now denoted by the Id's +workerInfo field. + +\begin{code} +data StrictnessInfo + = NoStrictnessInfo + + | StrictnessInfo [Demand] -- Demands on the arguments. + + Bool -- True <=> the function diverges regardless of its arguments + -- Useful for "error" and other disguised variants thereof. + -- BUT NB: f = \x y. error "urk" + -- will have info SI [SS] True + -- but still (f) and (f 2) are not bot; only (f 3 2) is bot + deriving( Eq ) + + -- NOTA BENE: if the arg demands are, say, [S,L], this means that + -- (f bot) is not necy bot, only (f bot x) is bot + -- We simply cannot express accurately the strictness of a function + -- like f = \x -> case x of (a,b) -> \y -> ... + -- The up-side is that we don't need to restrict the strictness info + -- to the visible arity of the function. + +seqStrictnessInfo :: StrictnessInfo -> () +seqStrictnessInfo (StrictnessInfo ds b) = b `seq` seqDemands ds +seqStrictnessInfo other = () +\end{code} + +\begin{code} +mkStrictnessInfo :: ([Demand], Bool) -> StrictnessInfo + +mkStrictnessInfo (xs, is_bot) + | all totally_boring xs && not is_bot = NoStrictnessInfo -- Uninteresting + | otherwise = StrictnessInfo xs is_bot + where + totally_boring (WwLazy False) = True + totally_boring other = False + +noStrictnessInfo = NoStrictnessInfo + +isBottomingStrictness (StrictnessInfo _ bot) = bot +isBottomingStrictness NoStrictnessInfo = False + +-- appIsBottom returns true if an application to n args would diverge +appIsBottom (StrictnessInfo ds bot) n = bot && (n >= length ds) +appIsBottom NoStrictnessInfo n = False + +ppStrictnessInfo NoStrictnessInfo = empty +ppStrictnessInfo (StrictnessInfo wrapper_args bot) = hsep [pprDemands wrapper_args bot] +\end{code}