/export/starexec/sandbox2/solver/bin/starexec_run_standard /export/starexec/sandbox2/benchmark/theBenchmark.hs /export/starexec/sandbox2/output/output_files -------------------------------------------------------------------------------- MAYBE proof of /export/starexec/sandbox2/benchmark/theBenchmark.hs # AProVE Commit ID: 48fb2092695e11cc9f56e44b17a92a5f88ffb256 marcel 20180622 unpublished dirty H-Termination with start terms of the given HASKELL could not be shown: (0) HASKELL (1) LR [EQUIVALENT, 0 ms] (2) HASKELL (3) CR [EQUIVALENT, 0 ms] (4) HASKELL (5) IFR [EQUIVALENT, 0 ms] (6) HASKELL (7) BR [EQUIVALENT, 0 ms] (8) HASKELL (9) COR [EQUIVALENT, 55 ms] (10) HASKELL (11) LetRed [EQUIVALENT, 20 ms] (12) HASKELL (13) NumRed [SOUND, 0 ms] (14) HASKELL ---------------------------------------- (0) Obligation: mainModule Main module Main where { import qualified Prelude; } ---------------------------------------- (1) LR (EQUIVALENT) Lambda Reductions: The following Lambda expression "\lv1->case lv1 of { ('F' : 'a' : 'l' : 's' : 'e' : [],r0) -> (False,r0) : []; _ -> []} " is transformed to "readsPrec0 lv1 = case lv1 of { ('F' : 'a' : 'l' : 's' : 'e' : [],r0) -> (False,r0) : []; _ -> []} ; " The following Lambda expression "\lr1->concatMap readsPrec0 (lex lr1)" is transformed to "readsPrec1 lr1 = concatMap readsPrec0 (lex lr1); " The following Lambda expression "\lv1->case lv1 of { ('T' : 'r' : 'u' : 'e' : [],r0) -> (True,r0) : []; _ -> []} " is transformed to "readsPrec2 lv1 = case lv1 of { ('T' : 'r' : 'u' : 'e' : [],r0) -> (True,r0) : []; _ -> []} ; " The following Lambda expression "\lr2->concatMap readsPrec2 (lex lr2)" is transformed to "readsPrec3 lr2 = concatMap readsPrec2 (lex lr2); " The following Lambda expression "\vu54->case vu54 of { (ch,''' : t) -> if ch /= ''' : [] then (''' : ch ++ ''' : [],t) : [] else []; _ -> []} " is transformed to "lex0 vu54 = case vu54 of { (ch,''' : t) -> if ch /= ''' : [] then (''' : ch ++ ''' : [],t) : [] else []; _ -> []} ; " The following Lambda expression "\vu56->case vu56 of { (str,u) -> (ch ++ str,u) : []; _ -> []} " is transformed to "lexString0 ch vu56 = case vu56 of { (str,u) -> (ch ++ str,u) : []; _ -> []} ; " The following Lambda expression "\vu57->case vu57 of { (ch,t) -> concatMap (lexString0 ch) (lexString t); _ -> []} " is transformed to "lexString1 vu57 = case vu57 of { (ch,t) -> concatMap (lexString0 ch) (lexString t); _ -> []} ; " The following Lambda expression "\vu58->case vu58 of { '\' : t -> ([],t) : []; _ -> []} " is transformed to "lexStrItem0 vu58 = case vu58 of { '\' : t -> ([],t) : []; _ -> []} ; " The following Lambda expression "\vu55->case vu55 of { (str,t) -> ('"' : str,t) : []; _ -> []} " is transformed to "lex1 vu55 = case vu55 of { (str,t) -> ('"' : str,t) : []; _ -> []} ; " The following Lambda expression "\vu63->case vu63 of { (e,u) -> ('.' : ds ++ e,u) : []; _ -> []} " is transformed to "lexFracExp0 ds vu63 = case vu63 of { (e,u) -> ('.' : ds ++ e,u) : []; _ -> []} ; " The following Lambda expression "\vu64->case vu64 of { (ds,t) -> concatMap (lexFracExp0 ds) (lexExp t); _ -> []} " is transformed to "lexFracExp1 vu64 = case vu64 of { (ds,t) -> concatMap (lexFracExp0 ds) (lexExp t); _ -> []} ; " The following Lambda expression "\vu65->case vu65 of { (ds,u) -> (e : c : ds,u) : []; _ -> []} " is transformed to "lexExp0 e c vu65 = case vu65 of { (ds,u) -> (e : c : ds,u) : []; _ -> []} ; " The following Lambda expression "\vu66->case vu66 of { c : t -> if c `elem` '+' : '-' : [] then concatMap (lexExp0 e c) (lexDigits t) else []; _ -> []} " is transformed to "lexExp1 e vu66 = case vu66 of { c : t -> if c `elem` '+' : '-' : [] then concatMap (lexExp0 e c) (lexDigits t) else []; _ -> []} ; " The following Lambda expression "\vu67->case vu67 of { (ds,t) -> (e : ds,t) : []; _ -> []} " is transformed to "lexExp2 e vu67 = case vu67 of { (ds,t) -> (e : ds,t) : []; _ -> []} ; " The following Lambda expression "\vu59->case vu59 of { (sym,t) -> (c : sym,t) : []; _ -> []} " is transformed to "lex2 c vu59 = case vu59 of { (sym,t) -> (c : sym,t) : []; _ -> []} ; " The following Lambda expression "\vu60->case vu60 of { (nam,t) -> (c : nam,t) : []; _ -> []} " is transformed to "lex3 c vu60 = case vu60 of { (nam,t) -> (c : nam,t) : []; _ -> []} ; " The following Lambda expression "\vu61->case vu61 of { (fe,t) -> (c : ds ++ fe,t) : []; _ -> []} " is transformed to "lex4 c ds vu61 = case vu61 of { (fe,t) -> (c : ds ++ fe,t) : []; _ -> []} ; " The following Lambda expression "\vu62->case vu62 of { (ds,s) -> concatMap (lex4 c ds) (lexFracExp s); _ -> []} " is transformed to "lex5 c vu62 = case vu62 of { (ds,s) -> concatMap (lex4 c ds) (lexFracExp s); _ -> []} ; " The following Lambda expression "\ab->(a,b)" is transformed to "zip0 a b = (a,b); " The following Lambda expression "\vu68->case vu68 of { (cs@(_ : _),t) -> (cs,t) : []; _ -> []} " is transformed to "nonnull0 vu68 = case vu68 of { (cs@(_ : _),t) -> (cs,t) : []; _ -> []} ; " The following Lambda expression "\vu48->case vu48 of { (')' : [],u) -> (x,u) : []; _ -> []} " is transformed to "mandatory0 x vu48 = case vu48 of { (')' : [],u) -> (x,u) : []; _ -> []} ; " The following Lambda expression "\vu49->case vu49 of { (x,t) -> concatMap (mandatory0 x) (lex t); _ -> []} " is transformed to "mandatory1 vu49 = case vu49 of { (x,t) -> concatMap (mandatory0 x) (lex t); _ -> []} ; " The following Lambda expression "\vu50->case vu50 of { ('(' : [],s) -> concatMap mandatory1 (optional s); _ -> []} " is transformed to "mandatory2 vu50 = case vu50 of { ('(' : [],s) -> concatMap mandatory1 (optional s); _ -> []} ; " The following Lambda expression "\ex->if isEOFError ex then return '\10' else ioError ex" is transformed to "getRest0 ex = if isEOFError ex then return '\10' else ioError ex; " The following Lambda expression "\cs->return (c : cs)" is transformed to "getRest1 c cs = return (c : cs); " The following Lambda expression "\c->if c == '\10' then return [] else getRest >>= getRest1 c" is transformed to "getRest2 c = if c == '\10' then return [] else getRest >>= getRest1 c; " The following Lambda expression "\ls->return (c : ls)" is transformed to "getLine0 c ls = return (c : ls); " The following Lambda expression "\c->if c == '\10' then return [] else getRest >>= getLine0 c" is transformed to "getLine1 c = if c == '\10' then return [] else getRest >>= getLine0 c; " The following Lambda expression "\vu89->case vu89 of { ([],[]) -> x : []; _ -> []} " is transformed to "readIO0 x vu89 = case vu89 of { ([],[]) -> x : []; _ -> []} ; " The following Lambda expression "\vu90->case vu90 of { (x,t) -> concatMap (readIO0 x) (lex t); _ -> []} " is transformed to "readIO1 vu90 = case vu90 of { (x,t) -> concatMap (readIO0 x) (lex t); _ -> []} ; " The following Lambda expression "\r->return r" is transformed to "readLn0 r = return r; " The following Lambda expression "\l->readIO l >>= readLn0" is transformed to "readLn1 l = readIO l >>= readLn0; " The following Lambda expression "\vu69->case vu69 of { ([],s') -> (mne,s') : []; _ -> []} " is transformed to "lexEsc0 mne vu69 = case vu69 of { ([],s') -> (mne,s') : []; _ -> []} ; " The following Lambda expression "\vu70->case vu70 of { (c,mne) -> concatMap (lexEsc0 mne) (lexmatch mne s : []); _ -> []} " is transformed to "lexEsc1 s vu70 = case vu70 of { (c,mne) -> concatMap (lexEsc0 mne) (lexmatch mne s : []); _ -> []} ; " The following Lambda expression "\(_,zs)->zs" is transformed to "zs0 (_,zs) = zs; " The following Lambda expression "\(ys,_)->ys" is transformed to "ys0 (ys,_) = ys; " ---------------------------------------- (2) Obligation: mainModule Main module Main where { import qualified Prelude; } ---------------------------------------- (3) CR (EQUIVALENT) Case Reductions: The following Case expression "case vu90 of { (x,t) -> concatMap (readIO0 x) (lex t); _ -> []} " is transformed to "readIO10 (x,t) = concatMap (readIO0 x) (lex t); readIO10 _ = []; " The following Case expression "case vu89 of { ([],[]) -> x : []; _ -> []} " is transformed to "readIO00 x ([],[]) = x : []; readIO00 x _ = []; " The following Case expression "case vu55 of { (str,t) -> ('"' : str,t) : []; _ -> []} " is transformed to "lex10 (str,t) = ('"' : str,t) : []; lex10 _ = []; " The following Case expression "case vu57 of { (ch,t) -> concatMap (lexString0 ch) (lexString t); _ -> []} " is transformed to "lexString10 (ch,t) = concatMap (lexString0 ch) (lexString t); lexString10 _ = []; " The following Case expression "case vu56 of { (str,u) -> (ch ++ str,u) : []; _ -> []} " is transformed to "lexString00 ch (str,u) = (ch ++ str,u) : []; lexString00 ch _ = []; " The following Case expression "case vu58 of { '\' : t -> ([],t) : []; _ -> []} " is transformed to "lexStrItem00 ('\' : t) = ([],t) : []; lexStrItem00 _ = []; " The following Case expression "case vu59 of { (sym,t) -> (c : sym,t) : []; _ -> []} " is transformed to "lex20 c (sym,t) = (c : sym,t) : []; lex20 c _ = []; " The following Case expression "case vu67 of { (ds,t) -> (e : ds,t) : []; _ -> []} " is transformed to "lexExp20 e (ds,t) = (e : ds,t) : []; lexExp20 e _ = []; " The following Case expression "case vu65 of { (ds,u) -> (e : c : ds,u) : []; _ -> []} " is transformed to "lexExp00 e c (ds,u) = (e : c : ds,u) : []; lexExp00 e c _ = []; " The following Case expression "case vu62 of { (ds,s) -> concatMap (lex4 c ds) (lexFracExp s); _ -> []} " is transformed to "lex50 c (ds,s) = concatMap (lex4 c ds) (lexFracExp s); lex50 c _ = []; " The following Case expression "case vu66 of { c : t -> if c `elem` '+' : '-' : [] then concatMap (lexExp0 e c) (lexDigits t) else []; _ -> []} " is transformed to "lexExp10 e (c : t) = if c `elem` '+' : '-' : [] then concatMap (lexExp0 e c) (lexDigits t) else []; lexExp10 e _ = []; " The following Case expression "case vu60 of { (nam,t) -> (c : nam,t) : []; _ -> []} " is transformed to "lex30 c (nam,t) = (c : nam,t) : []; lex30 c _ = []; " The following Case expression "case vu61 of { (fe,t) -> (c : ds ++ fe,t) : []; _ -> []} " is transformed to "lex40 c ds (fe,t) = (c : ds ++ fe,t) : []; lex40 c ds _ = []; " The following Case expression "case vu63 of { (e,u) -> ('.' : ds ++ e,u) : []; _ -> []} " is transformed to "lexFracExp00 ds (e,u) = ('.' : ds ++ e,u) : []; lexFracExp00 ds _ = []; " The following Case expression "case vu64 of { (ds,t) -> concatMap (lexFracExp0 ds) (lexExp t); _ -> []} " is transformed to "lexFracExp10 (ds,t) = concatMap (lexFracExp0 ds) (lexExp t); lexFracExp10 _ = []; " The following Case expression "case lv1 of { ('T' : 'r' : 'u' : 'e' : [],r0) -> (True,r0) : []; _ -> []} " is transformed to "readsPrec20 ('T' : 'r' : 'u' : 'e' : [],r0) = (True,r0) : []; readsPrec20 _ = []; " The following Case expression "case lv1 of { ('F' : 'a' : 'l' : 's' : 'e' : [],r0) -> (False,r0) : []; _ -> []} " is transformed to "readsPrec00 ('F' : 'a' : 'l' : 's' : 'e' : [],r0) = (False,r0) : []; readsPrec00 _ = []; " The following Case expression "case vu54 of { (ch,''' : t) -> if ch /= ''' : [] then (''' : ch ++ ''' : [],t) : [] else []; _ -> []} " is transformed to "lex00 (ch,''' : t) = if ch /= ''' : [] then (''' : ch ++ ''' : [],t) : [] else []; lex00 _ = []; " The following Case expression "case vu48 of { (')' : [],u) -> (x,u) : []; _ -> []} " is transformed to "mandatory00 x (')' : [],u) = (x,u) : []; mandatory00 x _ = []; " The following Case expression "case vu49 of { (x,t) -> concatMap (mandatory0 x) (lex t); _ -> []} " is transformed to "mandatory10 (x,t) = concatMap (mandatory0 x) (lex t); mandatory10 _ = []; " The following Case expression "case vu50 of { ('(' : [],s) -> concatMap mandatory1 (optional s); _ -> []} " is transformed to "mandatory20 ('(' : [],s) = concatMap mandatory1 (optional s); mandatory20 _ = []; " The following Case expression "case vu68 of { (cs@(_ : _),t) -> (cs,t) : []; _ -> []} " is transformed to "nonnull00 (cs@(_ : _),t) = (cs,t) : []; nonnull00 _ = []; " The following Case expression "case concatMap readIO1 (reads s) of { x : [] -> return x; [] -> ioError (userError ('N' : 'P' : [])); _ -> ioError (userError ('A' : 'P' : []))} " is transformed to "readIO2 (x : []) = return x; readIO2 [] = ioError (userError ('N' : 'P' : [])); readIO2 _ = ioError (userError ('A' : 'P' : [])); " The following Case expression "case concatMap (lexEsc1 s) table of { pr : _ -> pr : []; [] -> []} " is transformed to "lexEsc2 (pr : _) = pr : []; lexEsc2 [] = []; " The following Case expression "case vu69 of { ([],s') -> (mne,s') : []; _ -> []} " is transformed to "lexEsc00 mne ([],s') = (mne,s') : []; lexEsc00 mne _ = []; " The following Case expression "case vu70 of { (c,mne) -> concatMap (lexEsc0 mne) (lexmatch mne s : []); _ -> []} " is transformed to "lexEsc10 s (c,mne) = concatMap (lexEsc0 mne) (lexmatch mne s : []); lexEsc10 s _ = []; " ---------------------------------------- (4) Obligation: mainModule Main module Main where { import qualified Prelude; } ---------------------------------------- (5) IFR (EQUIVALENT) If Reductions: The following If expression "if c `elem` '+' : '-' : [] then concatMap (lexExp0 e c) (lexDigits t) else []" is transformed to "lexExp100 e c t True = concatMap (lexExp0 e c) (lexDigits t); lexExp100 e c t False = []; " The following If expression "if b then mandatory else optional" is transformed to "readParen0 True = mandatory; readParen0 False = optional; " The following If expression "if isEOFError ex then return '\10' else ioError ex" is transformed to "getRest00 ex True = return '\10'; getRest00 ex False = ioError ex; " The following If expression "if c == '\10' then return [] else getRest >>= getLine0 c" is transformed to "getLine10 c True = return []; getLine10 c False = getRest >>= getLine0 c; " The following If expression "if c == '\10' then return [] else getRest >>= getRest1 c" is transformed to "getRest20 c True = return []; getRest20 c False = getRest >>= getRest1 c; " The following If expression "if ch /= ''' : [] then (''' : ch ++ ''' : [],t) : [] else []" is transformed to "lex000 ch t True = (''' : ch ++ ''' : [],t) : []; lex000 ch t False = []; " ---------------------------------------- (6) Obligation: mainModule Main module Main where { import qualified Prelude; } ---------------------------------------- (7) BR (EQUIVALENT) Replaced joker patterns by fresh variables and removed binding patterns. Binding Reductions: The bind variable of the following binding Pattern "cs@(wu : wv)" is replaced by the following term "wu : wv" The bind variable of the following binding Pattern "xs@(vvv : vvw)" is replaced by the following term "vvv : vvw" The bind variable of the following binding Pattern "s@(vwu : vwv)" is replaced by the following term "vwu : vwv" The bind variable of the following binding Pattern "xs@(vxu : vxv)" is replaced by the following term "vxu : vxv" ---------------------------------------- (8) Obligation: mainModule Main module Main where { import qualified Prelude; } ---------------------------------------- (9) COR (EQUIVALENT) Cond Reductions: The following Function with conditions "readsPrec00 ('F' : 'a' : 'l' : 's' : 'e' : [],r0) = (False,r0) : []; readsPrec00 wx = []; " is transformed to "readsPrec00 (vyu : wuz,r0) = readsPrec006 (vyu : wuz,r0); readsPrec00 wx = readsPrec000 wx; " "readsPrec000 wx = []; " "readsPrec001 True (vyu : vyw : vyy : vzu : vzw : [],r0) = (False,r0) : []; readsPrec001 wvu wvv = readsPrec000 wvv; " "readsPrec002 True (vyu : vyw : vyy : vzu : vzw : vzx,r0) = readsPrec001 (vzw == 'e') (vyu : vyw : vyy : vzu : vzw : vzx,r0); readsPrec002 wvw wvx = readsPrec000 wvx; " "readsPrec003 True (vyu : vyw : vyy : vzu : vzz,r0) = readsPrec002 (vzu == 's') (vyu : vyw : vyy : vzu : vzz,r0); readsPrec003 wvy wvz = readsPrec000 wvz; " "readsPrec004 True (vyu : vyw : vyy : wuv,r0) = readsPrec003 (vyy == 'l') (vyu : vyw : vyy : wuv,r0); readsPrec004 wwu wwv = readsPrec000 wwv; " "readsPrec005 True (vyu : vyw : wux,r0) = readsPrec004 (vyw == 'a') (vyu : vyw : wux,r0); readsPrec005 www wwx = readsPrec000 wwx; " "readsPrec006 (vyu : wuz,r0) = readsPrec005 (vyu == 'F') (vyu : wuz,r0); readsPrec006 wwy = readsPrec000 wwy; " The following Function with conditions "takeWhile p [] = []; takeWhile p (x : xs)|p xx : takeWhile p xs|otherwise[]; " is transformed to "takeWhile p [] = takeWhile3 p []; takeWhile p (x : xs) = takeWhile2 p (x : xs); " "takeWhile1 p x xs True = x : takeWhile p xs; takeWhile1 p x xs False = takeWhile0 p x xs otherwise; " "takeWhile0 p x xs True = []; " "takeWhile2 p (x : xs) = takeWhile1 p x xs (p x); " "takeWhile3 p [] = []; takeWhile3 wxv wxw = takeWhile2 wxv wxw; " The following Function with conditions "lexString ('"' : s) = ('"' : [],s) : []; lexString s = concatMap lexString1 (lexStrItem s); " is transformed to "lexString (wxy : s) = lexString4 (wxy : s); lexString s = lexString2 s; " "lexString2 s = concatMap lexString1 (lexStrItem s); " "lexString3 True (wxy : s) = ('"' : [],s) : []; lexString3 wxz wyu = lexString2 wyu; " "lexString4 (wxy : s) = lexString3 (wxy == '"') (wxy : s); lexString4 wyv = lexString2 wyv; " The following Function with conditions "lexStrItem ('\' : '&' : s) = ('\' : '&' : [],s) : []; lexStrItem ('\' : c : s)|isSpace cconcatMap lexStrItem0 (dropWhile isSpace s : []); lexStrItem s = lexLitChar s; " is transformed to "lexStrItem (wzz : xux) = lexStrItem7 (wzz : xux); lexStrItem (wyx : wzu) = lexStrItem4 (wyx : wzu); lexStrItem s = lexStrItem1 s; " "lexStrItem1 s = lexLitChar s; " "lexStrItem2 wyx c s True = concatMap lexStrItem0 (dropWhile isSpace s : []); lexStrItem2 wyx c s False = lexStrItem1 (wyx : c : s); " "lexStrItem3 True (wyx : c : s) = lexStrItem2 wyx c s (isSpace c); lexStrItem3 wzv wzw = lexStrItem1 wzw; " "lexStrItem4 (wyx : wzu) = lexStrItem3 (wyx == '\') (wyx : wzu); lexStrItem4 wzx = lexStrItem1 wzx; " "lexStrItem5 True (wzz : xuv : s) = ('\' : '&' : [],s) : []; lexStrItem5 xuy xuz = lexStrItem4 xuz; " "lexStrItem6 True (wzz : xuv : s) = lexStrItem5 (xuv == '&') (wzz : xuv : s); lexStrItem6 xvu xvv = lexStrItem4 xvv; " "lexStrItem7 (wzz : xux) = lexStrItem6 (wzz == '\') (wzz : xux); lexStrItem7 xvw = lexStrItem4 xvw; " The following Function with conditions "lexStrItem00 ('\' : t) = ([],t) : []; lexStrItem00 xv = []; " is transformed to "lexStrItem00 (xvy : t) = lexStrItem002 (xvy : t); lexStrItem00 xv = lexStrItem000 xv; " "lexStrItem000 xv = []; " "lexStrItem001 True (xvy : t) = ([],t) : []; lexStrItem001 xvz xwu = lexStrItem000 xwu; " "lexStrItem002 (xvy : t) = lexStrItem001 (xvy == '\') (xvy : t); lexStrItem002 xwv = lexStrItem000 xwv; " The following Function with conditions "lexExp (e : s)|e `elem` 'e' : 'E' : []concatMap (lexExp1 e) (s : []) ++ concatMap (lexExp2 e) (lexDigits s); lexExp s = ([],s) : []; " is transformed to "lexExp (e : s) = lexExp5 (e : s); lexExp s = lexExp3 s; " "lexExp3 s = ([],s) : []; " "lexExp4 e s True = concatMap (lexExp1 e) (s : []) ++ concatMap (lexExp2 e) (lexDigits s); lexExp4 e s False = lexExp3 (e : s); " "lexExp5 (e : s) = lexExp4 e s (e `elem` 'e' : 'E' : []); lexExp5 xwx = lexExp3 xwx; " The following Function with conditions "lexFracExp ('.' : c : cs)|isDigit cconcatMap lexFracExp1 (lexDigits (c : cs)); lexFracExp s = lexExp s; " is transformed to "lexFracExp (xwz : xxw) = lexFracExp5 (xwz : xxw); lexFracExp s = lexFracExp2 s; " "lexFracExp2 s = lexExp s; " "lexFracExp3 xwz c cs True = concatMap lexFracExp1 (lexDigits (c : cs)); lexFracExp3 xwz c cs False = lexFracExp2 (xwz : c : cs); " "lexFracExp4 True (xwz : c : cs) = lexFracExp3 xwz c cs (isDigit c); lexFracExp4 xxx xxy = lexFracExp2 xxy; " "lexFracExp5 (xwz : xxw) = lexFracExp4 (xwz == '.') (xwz : xxw); lexFracExp5 xxz = lexFracExp2 xxz; " The following Function with conditions "lex [] = ([],[]) : []; lex (c : s)|isSpace clex (dropWhile isSpace s); lex (''' : s) = concatMap lex0 (lexLitChar s); lex ('"' : s) = concatMap lex1 (lexString s) where { lex1 vu55 = lex10 vu55; ; lex10 (str,t) = ('"' : str,t) : []; lex10 xw = []; ; lexStrItem ('\' : '&' : s) = ('\' : '&' : [],s) : []; lexStrItem ('\' : c : s)|isSpace cconcatMap lexStrItem0 (dropWhile isSpace s : []); lexStrItem s = lexLitChar s; ; lexStrItem0 vu58 = lexStrItem00 vu58; ; lexStrItem00 ('\' : t) = ([],t) : []; lexStrItem00 xv = []; ; lexString ('"' : s) = ('"' : [],s) : []; lexString s = concatMap lexString1 (lexStrItem s); ; lexString0 ch vu56 = lexString00 ch vu56; ; lexString00 ch (str,u) = (ch ++ str,u) : []; lexString00 ch wz = []; ; lexString1 vu57 = lexString10 vu57; ; lexString10 (ch,t) = concatMap (lexString0 ch) (lexString t); lexString10 xu = []; } ; lex (c : s)|isSingle c(c : [],s) : []|isSym cconcatMap (lex2 c) (span isSym s : [])|isAlpha cconcatMap (lex3 c) (span isIdChar s : [])|isDigit cconcatMap (lex5 c) (span isDigit s : [])|otherwise[] where { isIdChar c = isAlphaNum c || c `elem` '_' : ''' : []; ; isSingle c = c `elem` ',' : ';' : '(' : ')' : '[' : ']' : '{' : '}' : '_' : '`' : []; ; isSym c = c `elem` '!' : '@' : '#' : '$' : '%' : '&' : '*' : '+' : '.' : '/' : '<' : '=' : '>' : '?' : '\' : '^' : '|' : ':' : '-' : '~' : []; ; lex2 c vu59 = lex20 c vu59; ; lex20 c (sym,t) = (c : sym,t) : []; lex20 c yy = []; ; lex3 c vu60 = lex30 c vu60; ; lex30 c (nam,t) = (c : nam,t) : []; lex30 c yz = []; ; lex4 c ds vu61 = lex40 c ds vu61; ; lex40 c ds (fe,t) = (c : ds ++ fe,t) : []; lex40 c ds yw = []; ; lex5 c vu62 = lex50 c vu62; ; lex50 c (ds,s) = concatMap (lex4 c ds) (lexFracExp s); lex50 c yx = []; ; lexExp (e : s)|e `elem` 'e' : 'E' : []concatMap (lexExp1 e) (s : []) ++ concatMap (lexExp2 e) (lexDigits s); lexExp s = ([],s) : []; ; lexExp0 e c vu65 = lexExp00 e c vu65; ; lexExp00 e c (ds,u) = (e : c : ds,u) : []; lexExp00 e c xx = []; ; lexExp1 e vu66 = lexExp10 e vu66; ; lexExp10 e (c : t) = lexExp100 e c t (c `elem` '+' : '-' : []); lexExp10 e xz = []; ; lexExp100 e c t True = concatMap (lexExp0 e c) (lexDigits t); lexExp100 e c t False = []; ; lexExp2 e vu67 = lexExp20 e vu67; ; lexExp20 e (ds,t) = (e : ds,t) : []; lexExp20 e xy = []; ; lexFracExp ('.' : c : cs)|isDigit cconcatMap lexFracExp1 (lexDigits (c : cs)); lexFracExp s = lexExp s; ; lexFracExp0 ds vu63 = lexFracExp00 ds vu63; ; lexFracExp00 ds (e,u) = ('.' : ds ++ e,u) : []; lexFracExp00 ds yv = []; ; lexFracExp1 vu64 = lexFracExp10 vu64; ; lexFracExp10 (ds,t) = concatMap (lexFracExp0 ds) (lexExp t); lexFracExp10 yu = []; } ; " is transformed to "lex [] = lex19 []; lex (c : s) = lex18 (c : s); lex (xzv : s) = lex16 (xzv : s); lex (xyw : s) = lex14 (xyw : s); lex (c : s) = lex12 (c : s); " "lex12 (c : s) = lex11 c s (isSingle c) where { isIdChar c = isAlphaNum c || c `elem` '_' : ''' : []; ; isSingle c = c `elem` ',' : ';' : '(' : ')' : '[' : ']' : '{' : '}' : '_' : '`' : []; ; isSym c = c `elem` '!' : '@' : '#' : '$' : '%' : '&' : '*' : '+' : '.' : '/' : '<' : '=' : '>' : '?' : '\' : '^' : '|' : ':' : '-' : '~' : []; ; lex11 c s True = (c : [],s) : []; lex11 c s False = lex9 c s (isSym c); ; lex2 c vu59 = lex20 c vu59; ; lex20 c (sym,t) = (c : sym,t) : []; lex20 c yy = []; ; lex3 c vu60 = lex30 c vu60; ; lex30 c (nam,t) = (c : nam,t) : []; lex30 c yz = []; ; lex4 c ds vu61 = lex40 c ds vu61; ; lex40 c ds (fe,t) = (c : ds ++ fe,t) : []; lex40 c ds yw = []; ; lex5 c vu62 = lex50 c vu62; ; lex50 c (ds,s) = concatMap (lex4 c ds) (lexFracExp s); lex50 c yx = []; ; lex6 c s True = []; ; lex7 c s True = concatMap (lex5 c) (span isDigit s : []); lex7 c s False = lex6 c s otherwise; ; lex8 c s True = concatMap (lex3 c) (span isIdChar s : []); lex8 c s False = lex7 c s (isDigit c); ; lex9 c s True = concatMap (lex2 c) (span isSym s : []); lex9 c s False = lex8 c s (isAlpha c); ; lexExp (e : s) = lexExp5 (e : s); lexExp s = lexExp3 s; ; lexExp0 e c vu65 = lexExp00 e c vu65; ; lexExp00 e c (ds,u) = (e : c : ds,u) : []; lexExp00 e c xx = []; ; lexExp1 e vu66 = lexExp10 e vu66; ; lexExp10 e (c : t) = lexExp100 e c t (c `elem` '+' : '-' : []); lexExp10 e xz = []; ; lexExp100 e c t True = concatMap (lexExp0 e c) (lexDigits t); lexExp100 e c t False = []; ; lexExp2 e vu67 = lexExp20 e vu67; ; lexExp20 e (ds,t) = (e : ds,t) : []; lexExp20 e xy = []; ; lexExp3 s = ([],s) : []; ; lexExp4 e s True = concatMap (lexExp1 e) (s : []) ++ concatMap (lexExp2 e) (lexDigits s); lexExp4 e s False = lexExp3 (e : s); ; lexExp5 (e : s) = lexExp4 e s (e `elem` 'e' : 'E' : []); lexExp5 xwx = lexExp3 xwx; ; lexFracExp (xwz : xxw) = lexFracExp5 (xwz : xxw); lexFracExp s = lexFracExp2 s; ; lexFracExp0 ds vu63 = lexFracExp00 ds vu63; ; lexFracExp00 ds (e,u) = ('.' : ds ++ e,u) : []; lexFracExp00 ds yv = []; ; lexFracExp1 vu64 = lexFracExp10 vu64; ; lexFracExp10 (ds,t) = concatMap (lexFracExp0 ds) (lexExp t); lexFracExp10 yu = []; ; lexFracExp2 s = lexExp s; ; lexFracExp3 xwz c cs True = concatMap lexFracExp1 (lexDigits (c : cs)); lexFracExp3 xwz c cs False = lexFracExp2 (xwz : c : cs); ; lexFracExp4 True (xwz : c : cs) = lexFracExp3 xwz c cs (isDigit c); lexFracExp4 xxx xxy = lexFracExp2 xxy; ; lexFracExp5 (xwz : xxw) = lexFracExp4 (xwz == '.') (xwz : xxw); lexFracExp5 xxz = lexFracExp2 xxz; } ; " "lex13 True (xyw : s) = concatMap lex1 (lexString s) where { lex1 vu55 = lex10 vu55; ; lex10 (str,t) = ('"' : str,t) : []; lex10 xw = []; ; lexStrItem (wzz : xux) = lexStrItem7 (wzz : xux); lexStrItem (wyx : wzu) = lexStrItem4 (wyx : wzu); lexStrItem s = lexStrItem1 s; ; lexStrItem0 vu58 = lexStrItem00 vu58; ; lexStrItem00 (xvy : t) = lexStrItem002 (xvy : t); lexStrItem00 xv = lexStrItem000 xv; ; lexStrItem000 xv = []; ; lexStrItem001 True (xvy : t) = ([],t) : []; lexStrItem001 xvz xwu = lexStrItem000 xwu; ; lexStrItem002 (xvy : t) = lexStrItem001 (xvy == '\') (xvy : t); lexStrItem002 xwv = lexStrItem000 xwv; ; lexStrItem1 s = lexLitChar s; ; lexStrItem2 wyx c s True = concatMap lexStrItem0 (dropWhile isSpace s : []); lexStrItem2 wyx c s False = lexStrItem1 (wyx : c : s); ; lexStrItem3 True (wyx : c : s) = lexStrItem2 wyx c s (isSpace c); lexStrItem3 wzv wzw = lexStrItem1 wzw; ; lexStrItem4 (wyx : wzu) = lexStrItem3 (wyx == '\') (wyx : wzu); lexStrItem4 wzx = lexStrItem1 wzx; ; lexStrItem5 True (wzz : xuv : s) = ('\' : '&' : [],s) : []; lexStrItem5 xuy xuz = lexStrItem4 xuz; ; lexStrItem6 True (wzz : xuv : s) = lexStrItem5 (xuv == '&') (wzz : xuv : s); lexStrItem6 xvu xvv = lexStrItem4 xvv; ; lexStrItem7 (wzz : xux) = lexStrItem6 (wzz == '\') (wzz : xux); lexStrItem7 xvw = lexStrItem4 xvw; ; lexString (wxy : s) = lexString4 (wxy : s); lexString s = lexString2 s; ; lexString0 ch vu56 = lexString00 ch vu56; ; lexString00 ch (str,u) = (ch ++ str,u) : []; lexString00 ch wz = []; ; lexString1 vu57 = lexString10 vu57; ; lexString10 (ch,t) = concatMap (lexString0 ch) (lexString t); lexString10 xu = []; ; lexString2 s = concatMap lexString1 (lexStrItem s); ; lexString3 True (wxy : s) = ('"' : [],s) : []; lexString3 wxz wyu = lexString2 wyu; ; lexString4 (wxy : s) = lexString3 (wxy == '"') (wxy : s); lexString4 wyv = lexString2 wyv; } ; lex13 xyx xyy = lex12 xyy; " "lex14 (xyw : s) = lex13 (xyw == '"') (xyw : s); lex14 xyz = lex12 xyz; " "lex15 True (xzv : s) = concatMap lex0 (lexLitChar s); lex15 xzw xzx = lex14 xzx; " "lex16 (xzv : s) = lex15 (xzv == ''') (xzv : s); lex16 xzy = lex14 xzy; " "lex17 c s True = lex (dropWhile isSpace s); lex17 c s False = lex16 (c : s); " "lex18 (c : s) = lex17 c s (isSpace c); lex18 yuu = lex16 yuu; " "lex19 [] = ([],[]) : []; lex19 yuw = lex18 yuw; " The following Function with conditions "getChar |terminatorreturn terminator|otherwiseaIOE IOError_EOF; " is transformed to "getChar = getChar2; " "getChar1 True = return terminator; getChar1 False = getChar0 otherwise; " "getChar0 True = aIOE IOError_EOF; " "getChar2 = getChar1 terminator; " The following Function with conditions "lexmatch (x : xs) (y : ys)|x == ylexmatch xs ys; lexmatch xs ys = (xs,ys); " is transformed to "lexmatch (x : xs) (y : ys) = lexmatch2 (x : xs) (y : ys); lexmatch xs ys = lexmatch0 xs ys; " "lexmatch0 xs ys = (xs,ys); " "lexmatch1 x xs y ys True = lexmatch xs ys; lexmatch1 x xs y ys False = lexmatch0 (x : xs) (y : ys); " "lexmatch2 (x : xs) (y : ys) = lexmatch1 x xs y ys (x == y); lexmatch2 yuz yvu = lexmatch0 yuz yvu; " The following Function with conditions "readsPrec20 ('T' : 'r' : 'u' : 'e' : [],r0) = (True,r0) : []; readsPrec20 vuw = []; " is transformed to "readsPrec20 (yvx : yxy,r0) = readsPrec205 (yvx : yxy,r0); readsPrec20 vuw = readsPrec200 vuw; " "readsPrec200 vuw = []; " "readsPrec201 True (yvx : yvz : ywv : ywx : [],r0) = (True,r0) : []; readsPrec201 yxz yyu = readsPrec200 yyu; " "readsPrec202 True (yvx : yvz : ywv : ywx : ywy,r0) = readsPrec201 (ywx == 'e') (yvx : yvz : ywv : ywx : ywy,r0); readsPrec202 yyv yyw = readsPrec200 yyw; " "readsPrec203 True (yvx : yvz : ywv : yxu,r0) = readsPrec202 (ywv == 'u') (yvx : yvz : ywv : yxu,r0); readsPrec203 yyx yyy = readsPrec200 yyy; " "readsPrec204 True (yvx : yvz : yxw,r0) = readsPrec203 (yvz == 'r') (yvx : yvz : yxw,r0); readsPrec204 yyz yzu = readsPrec200 yzu; " "readsPrec205 (yvx : yxy,r0) = readsPrec204 (yvx == 'T') (yvx : yxy,r0); readsPrec205 yzv = readsPrec200 yzv; " The following Function with conditions "undefined |Falseundefined; " is transformed to "undefined = undefined1; " "undefined0 True = undefined; " "undefined1 = undefined0 False; " The following Function with conditions "mandatory20 ('(' : [],s) = concatMap mandatory1 (optional s); mandatory20 vuy = []; " is transformed to "mandatory20 (yzy : yzz,s) = mandatory202 (yzy : yzz,s); mandatory20 vuy = mandatory200 vuy; " "mandatory200 vuy = []; " "mandatory201 True (yzy : [],s) = concatMap mandatory1 (optional s); mandatory201 zuu zuv = mandatory200 zuv; " "mandatory202 (yzy : yzz,s) = mandatory201 (yzy == '(') (yzy : yzz,s); mandatory202 zuw = mandatory200 zuw; " The following Function with conditions "mandatory00 x (')' : [],u) = (x,u) : []; mandatory00 x vuz = []; " is transformed to "mandatory00 x (zuz : zvu,u) = mandatory002 x (zuz : zvu,u); mandatory00 x vuz = mandatory000 x vuz; " "mandatory000 x vuz = []; " "mandatory001 True x (zuz : [],u) = (x,u) : []; mandatory001 zvv zvw zvx = mandatory000 zvw zvx; " "mandatory002 x (zuz : zvu,u) = mandatory001 (zuz == ')') x (zuz : zvu,u); mandatory002 zvy zvz = mandatory000 zvy zvz; " The following Function with conditions "dropWhile p [] = []; dropWhile p (vvv : vvw)|p vvvdropWhile p vvw|otherwisevvv : vvw; " is transformed to "dropWhile p [] = dropWhile3 p []; dropWhile p (vvv : vvw) = dropWhile2 p (vvv : vvw); " "dropWhile0 p vvv vvw True = vvv : vvw; " "dropWhile1 p vvv vvw True = dropWhile p vvw; dropWhile1 p vvv vvw False = dropWhile0 p vvv vvw otherwise; " "dropWhile2 p (vvv : vvw) = dropWhile1 p vvv vvw (p vvv); " "dropWhile3 p [] = []; dropWhile3 zww zwx = dropWhile2 zww zwx; " The following Function with conditions "lex00 (ch,''' : t) = lex000 ch t (ch /= ''' : []); lex00 vvy = []; " is transformed to "lex00 (ch,zxu : t) = lex003 (ch,zxu : t); lex00 vvy = lex001 vvy; " "lex001 vvy = []; " "lex002 True (ch,zxu : t) = lex000 ch t (ch /= ''' : []); lex002 zxv zxw = lex001 zxw; " "lex003 (ch,zxu : t) = lex002 (zxu == ''') (ch,zxu : t); lex003 zxx = lex001 zxx; " The following Function with conditions "lexEsc (c : s)|c `elem` 'a' : 'b' : 'f' : 'n' : 'r' : 't' : 'v' : '\' : '"' : ''' : [](c : [],s) : []; lexEsc ('^' : c : s)|c >= '@' && c <= '_'('^' : c : [],s) : []; lexEsc ('o' : s) = prefix 'o' (span isOctDigit s) : []; lexEsc ('x' : s) = prefix 'x' (span isHexDigit s) : []; lexEsc (vwu : vwv)|isDigit vwuspan isDigit (vwu : vwv) : []|isUpper vwulexEsc2 (concatMap (lexEsc1 (vwu : vwv)) table); lexEsc vww = []; " is transformed to "lexEsc (c : s) = lexEsc16 (c : s); lexEsc (zzz : vuuw) = lexEsc14 (zzz : vuuw); lexEsc (zzu : s) = lexEsc11 (zzu : s); lexEsc (zyv : s) = lexEsc8 (zyv : s); lexEsc (vwu : vwv) = lexEsc6 (vwu : vwv); lexEsc vww = lexEsc3 vww; " "lexEsc3 vww = []; " "lexEsc4 vwu vwv True = lexEsc2 (concatMap (lexEsc1 (vwu : vwv)) table); lexEsc4 vwu vwv False = lexEsc3 (vwu : vwv); " "lexEsc5 vwu vwv True = span isDigit (vwu : vwv) : []; lexEsc5 vwu vwv False = lexEsc4 vwu vwv (isUpper vwu); " "lexEsc6 (vwu : vwv) = lexEsc5 vwu vwv (isDigit vwu); lexEsc6 zxz = lexEsc3 zxz; " "lexEsc7 True (zyv : s) = prefix 'x' (span isHexDigit s) : []; lexEsc7 zyw zyx = lexEsc6 zyx; " "lexEsc8 (zyv : s) = lexEsc7 (zyv == 'x') (zyv : s); lexEsc8 zyy = lexEsc6 zyy; " "lexEsc9 True (zzu : s) = prefix 'o' (span isOctDigit s) : []; lexEsc9 zzv zzw = lexEsc8 zzw; " "lexEsc11 (zzu : s) = lexEsc9 (zzu == 'o') (zzu : s); lexEsc11 zzx = lexEsc8 zzx; " "lexEsc12 zzz c s True = ('^' : c : [],s) : []; lexEsc12 zzz c s False = lexEsc11 (zzz : c : s); " "lexEsc13 True (zzz : c : s) = lexEsc12 zzz c s (c >= '@' && c <= '_'); lexEsc13 vuux vuuy = lexEsc11 vuuy; " "lexEsc14 (zzz : vuuw) = lexEsc13 (zzz == '^') (zzz : vuuw); lexEsc14 vuuz = lexEsc11 vuuz; " "lexEsc15 c s True = (c : [],s) : []; lexEsc15 c s False = lexEsc14 (c : s); " "lexEsc16 (c : s) = lexEsc15 c s (c `elem` 'a' : 'b' : 'f' : 'n' : 'r' : 't' : 'v' : '\' : '"' : ''' : []); lexEsc16 vuvv = lexEsc14 vuvv; " The following Function with conditions "lexLitChar [] = []; lexLitChar (c : s)|c /= '\'(c : [],s) : []|otherwisemap (prefix '\') (lexEsc s) where { lexEsc (c : s)|c `elem` 'a' : 'b' : 'f' : 'n' : 'r' : 't' : 'v' : '\' : '"' : ''' : [](c : [],s) : []; lexEsc ('^' : c : s)|c >= '@' && c <= '_'('^' : c : [],s) : []; lexEsc ('o' : s) = prefix 'o' (span isOctDigit s) : []; lexEsc ('x' : s) = prefix 'x' (span isHexDigit s) : []; lexEsc (vwu : vwv)|isDigit vwuspan isDigit (vwu : vwv) : []|isUpper vwulexEsc2 (concatMap (lexEsc1 (vwu : vwv)) table); lexEsc vww = []; ; lexEsc0 mne vu69 = lexEsc00 mne vu69; ; lexEsc00 mne ([],s') = (mne,s') : []; lexEsc00 mne vwy = []; ; lexEsc1 s vu70 = lexEsc10 s vu70; ; lexEsc10 s (c,mne) = concatMap (lexEsc0 mne) (lexmatch mne s : []); lexEsc10 s vwz = []; ; lexEsc2 (pr : vwx) = pr : []; lexEsc2 [] = []; ; prefix c (t,s) = (c : t,s); ; table = ('\127','D' : 'E' : 'L' : []) : asciiTab; } ; " is transformed to "lexLitChar [] = lexLitChar3 []; lexLitChar (c : s) = lexLitChar2 (c : s); " "lexLitChar2 (c : s) = lexLitChar1 c s (c /= '\') where { lexEsc (c : s) = lexEsc16 (c : s); lexEsc (zzz : vuuw) = lexEsc14 (zzz : vuuw); lexEsc (zzu : s) = lexEsc11 (zzu : s); lexEsc (zyv : s) = lexEsc8 (zyv : s); lexEsc (vwu : vwv) = lexEsc6 (vwu : vwv); lexEsc vww = lexEsc3 vww; ; lexEsc0 mne vu69 = lexEsc00 mne vu69; ; lexEsc00 mne ([],s') = (mne,s') : []; lexEsc00 mne vwy = []; ; lexEsc1 s vu70 = lexEsc10 s vu70; ; lexEsc10 s (c,mne) = concatMap (lexEsc0 mne) (lexmatch mne s : []); lexEsc10 s vwz = []; ; lexEsc11 (zzu : s) = lexEsc9 (zzu == 'o') (zzu : s); lexEsc11 zzx = lexEsc8 zzx; ; lexEsc12 zzz c s True = ('^' : c : [],s) : []; lexEsc12 zzz c s False = lexEsc11 (zzz : c : s); ; lexEsc13 True (zzz : c : s) = lexEsc12 zzz c s (c >= '@' && c <= '_'); lexEsc13 vuux vuuy = lexEsc11 vuuy; ; lexEsc14 (zzz : vuuw) = lexEsc13 (zzz == '^') (zzz : vuuw); lexEsc14 vuuz = lexEsc11 vuuz; ; lexEsc15 c s True = (c : [],s) : []; lexEsc15 c s False = lexEsc14 (c : s); ; lexEsc16 (c : s) = lexEsc15 c s (c `elem` 'a' : 'b' : 'f' : 'n' : 'r' : 't' : 'v' : '\' : '"' : ''' : []); lexEsc16 vuvv = lexEsc14 vuvv; ; lexEsc2 (pr : vwx) = pr : []; lexEsc2 [] = []; ; lexEsc3 vww = []; ; lexEsc4 vwu vwv True = lexEsc2 (concatMap (lexEsc1 (vwu : vwv)) table); lexEsc4 vwu vwv False = lexEsc3 (vwu : vwv); ; lexEsc5 vwu vwv True = span isDigit (vwu : vwv) : []; lexEsc5 vwu vwv False = lexEsc4 vwu vwv (isUpper vwu); ; lexEsc6 (vwu : vwv) = lexEsc5 vwu vwv (isDigit vwu); lexEsc6 zxz = lexEsc3 zxz; ; lexEsc7 True (zyv : s) = prefix 'x' (span isHexDigit s) : []; lexEsc7 zyw zyx = lexEsc6 zyx; ; lexEsc8 (zyv : s) = lexEsc7 (zyv == 'x') (zyv : s); lexEsc8 zyy = lexEsc6 zyy; ; lexEsc9 True (zzu : s) = prefix 'o' (span isOctDigit s) : []; lexEsc9 zzv zzw = lexEsc8 zzw; ; lexLitChar0 c s True = map (prefix '\') (lexEsc s); ; lexLitChar1 c s True = (c : [],s) : []; lexLitChar1 c s False = lexLitChar0 c s otherwise; ; prefix c (t,s) = (c : t,s); ; table = ('\127','D' : 'E' : 'L' : []) : asciiTab; } ; " "lexLitChar3 [] = []; lexLitChar3 vuvy = lexLitChar2 vuvy; " The following Function with conditions "span p [] = ([],[]); span p (vxu : vxv)|p vxu(vxu : ys,zs)|otherwise([],vxu : vxv) where { vu43 = span p vxv; ; ys = ys0 vu43; ; ys0 (ys,vxx) = ys; ; zs = zs0 vu43; ; zs0 (vxw,zs) = zs; } ; " is transformed to "span p [] = span3 p []; span p (vxu : vxv) = span2 p (vxu : vxv); " "span2 p (vxu : vxv) = span1 p vxu vxv (p vxu) where { span0 p vxu vxv True = ([],vxu : vxv); ; span1 p vxu vxv True = (vxu : ys,zs); span1 p vxu vxv False = span0 p vxu vxv otherwise; ; vu43 = span p vxv; ; ys = ys0 vu43; ; ys0 (ys,vxx) = ys; ; zs = zs0 vu43; ; zs0 (vxw,zs) = zs; } ; " "span3 p [] = ([],[]); span3 vuwv vuww = span2 vuwv vuww; " ---------------------------------------- (10) Obligation: mainModule Main module Main where { import qualified Prelude; } ---------------------------------------- (11) LetRed (EQUIVALENT) Let/Where Reductions: The bindings of the following Let/Where expression "lexLitChar1 c s (c /= '\') where { lexEsc (c : s) = lexEsc16 (c : s); lexEsc (zzz : vuuw) = lexEsc14 (zzz : vuuw); lexEsc (zzu : s) = lexEsc11 (zzu : s); lexEsc (zyv : s) = lexEsc8 (zyv : s); lexEsc (vwu : vwv) = lexEsc6 (vwu : vwv); lexEsc vww = lexEsc3 vww; ; lexEsc0 mne vu69 = lexEsc00 mne vu69; ; lexEsc00 mne ([],s') = (mne,s') : []; lexEsc00 mne vwy = []; ; lexEsc1 s vu70 = lexEsc10 s vu70; ; lexEsc10 s (c,mne) = concatMap (lexEsc0 mne) (lexmatch mne s : []); lexEsc10 s vwz = []; ; lexEsc11 (zzu : s) = lexEsc9 (zzu == 'o') (zzu : s); lexEsc11 zzx = lexEsc8 zzx; ; lexEsc12 zzz c s True = ('^' : c : [],s) : []; lexEsc12 zzz c s False = lexEsc11 (zzz : c : s); ; lexEsc13 True (zzz : c : s) = lexEsc12 zzz c s (c >= '@' && c <= '_'); lexEsc13 vuux vuuy = lexEsc11 vuuy; ; lexEsc14 (zzz : vuuw) = lexEsc13 (zzz == '^') (zzz : vuuw); lexEsc14 vuuz = lexEsc11 vuuz; ; lexEsc15 c s True = (c : [],s) : []; lexEsc15 c s False = lexEsc14 (c : s); ; lexEsc16 (c : s) = lexEsc15 c s (c `elem` 'a' : 'b' : 'f' : 'n' : 'r' : 't' : 'v' : '\' : '"' : ''' : []); lexEsc16 vuvv = lexEsc14 vuvv; ; lexEsc2 (pr : vwx) = pr : []; lexEsc2 [] = []; ; lexEsc3 vww = []; ; lexEsc4 vwu vwv True = lexEsc2 (concatMap (lexEsc1 (vwu : vwv)) table); lexEsc4 vwu vwv False = lexEsc3 (vwu : vwv); ; lexEsc5 vwu vwv True = span isDigit (vwu : vwv) : []; lexEsc5 vwu vwv False = lexEsc4 vwu vwv (isUpper vwu); ; lexEsc6 (vwu : vwv) = lexEsc5 vwu vwv (isDigit vwu); lexEsc6 zxz = lexEsc3 zxz; ; lexEsc7 True (zyv : s) = prefix 'x' (span isHexDigit s) : []; lexEsc7 zyw zyx = lexEsc6 zyx; ; lexEsc8 (zyv : s) = lexEsc7 (zyv == 'x') (zyv : s); lexEsc8 zyy = lexEsc6 zyy; ; lexEsc9 True (zzu : s) = prefix 'o' (span isOctDigit s) : []; lexEsc9 zzv zzw = lexEsc8 zzw; ; lexLitChar0 c s True = map (prefix '\') (lexEsc s); ; lexLitChar1 c s True = (c : [],s) : []; lexLitChar1 c s False = lexLitChar0 c s otherwise; ; prefix c (t,s) = (c : t,s); ; table = ('\127','D' : 'E' : 'L' : []) : asciiTab; } " are unpacked to the following functions on top level "lexLitChar2LexEsc15 c s True = (c : [],s) : []; lexLitChar2LexEsc15 c s False = lexLitChar2LexEsc14 (c : s); " "lexLitChar2Prefix c (t,s) = (c : t,s); " "lexLitChar2LexEsc4 vwu vwv True = lexLitChar2LexEsc2 (concatMap (lexLitChar2LexEsc1 (vwu : vwv)) lexLitChar2Table); lexLitChar2LexEsc4 vwu vwv False = lexLitChar2LexEsc3 (vwu : vwv); " "lexLitChar2LexLitChar0 c s True = map (lexLitChar2Prefix '\') (lexLitChar2LexEsc s); " "lexLitChar2LexEsc9 True (zzu : s) = lexLitChar2Prefix 'o' (span isOctDigit s) : []; lexLitChar2LexEsc9 zzv zzw = lexLitChar2LexEsc8 zzw; " "lexLitChar2LexEsc8 (zyv : s) = lexLitChar2LexEsc7 (zyv == 'x') (zyv : s); lexLitChar2LexEsc8 zyy = lexLitChar2LexEsc6 zyy; " "lexLitChar2LexEsc (c : s) = lexLitChar2LexEsc16 (c : s); lexLitChar2LexEsc (zzz : vuuw) = lexLitChar2LexEsc14 (zzz : vuuw); lexLitChar2LexEsc (zzu : s) = lexLitChar2LexEsc11 (zzu : s); lexLitChar2LexEsc (zyv : s) = lexLitChar2LexEsc8 (zyv : s); lexLitChar2LexEsc (vwu : vwv) = lexLitChar2LexEsc6 (vwu : vwv); lexLitChar2LexEsc vww = lexLitChar2LexEsc3 vww; " "lexLitChar2LexEsc5 vwu vwv True = span isDigit (vwu : vwv) : []; lexLitChar2LexEsc5 vwu vwv False = lexLitChar2LexEsc4 vwu vwv (isUpper vwu); " "lexLitChar2LexEsc3 vww = []; " "lexLitChar2LexEsc1 s vu70 = lexLitChar2LexEsc10 s vu70; " "lexLitChar2LexEsc13 True (zzz : c : s) = lexLitChar2LexEsc12 zzz c s (c >= '@' && c <= '_'); lexLitChar2LexEsc13 vuux vuuy = lexLitChar2LexEsc11 vuuy; " "lexLitChar2LexEsc11 (zzu : s) = lexLitChar2LexEsc9 (zzu == 'o') (zzu : s); lexLitChar2LexEsc11 zzx = lexLitChar2LexEsc8 zzx; " "lexLitChar2LexEsc16 (c : s) = lexLitChar2LexEsc15 c s (c `elem` 'a' : 'b' : 'f' : 'n' : 'r' : 't' : 'v' : '\' : '"' : ''' : []); lexLitChar2LexEsc16 vuvv = lexLitChar2LexEsc14 vuvv; " "lexLitChar2LexEsc00 mne ([],s') = (mne,s') : []; lexLitChar2LexEsc00 mne vwy = []; " "lexLitChar2LexEsc10 s (c,mne) = concatMap (lexLitChar2LexEsc0 mne) (lexmatch mne s : []); lexLitChar2LexEsc10 s vwz = []; " "lexLitChar2LexEsc0 mne vu69 = lexLitChar2LexEsc00 mne vu69; " "lexLitChar2LexLitChar1 c s True = (c : [],s) : []; lexLitChar2LexLitChar1 c s False = lexLitChar2LexLitChar0 c s otherwise; " "lexLitChar2LexEsc12 zzz c s True = ('^' : c : [],s) : []; lexLitChar2LexEsc12 zzz c s False = lexLitChar2LexEsc11 (zzz : c : s); " "lexLitChar2Table = ('\127','D' : 'E' : 'L' : []) : asciiTab; " "lexLitChar2LexEsc7 True (zyv : s) = lexLitChar2Prefix 'x' (span isHexDigit s) : []; lexLitChar2LexEsc7 zyw zyx = lexLitChar2LexEsc6 zyx; " "lexLitChar2LexEsc14 (zzz : vuuw) = lexLitChar2LexEsc13 (zzz == '^') (zzz : vuuw); lexLitChar2LexEsc14 vuuz = lexLitChar2LexEsc11 vuuz; " "lexLitChar2LexEsc6 (vwu : vwv) = lexLitChar2LexEsc5 vwu vwv (isDigit vwu); lexLitChar2LexEsc6 zxz = lexLitChar2LexEsc3 zxz; " "lexLitChar2LexEsc2 (pr : vwx) = pr : []; lexLitChar2LexEsc2 [] = []; " The bindings of the following Let/Where expression "concatMap lex1 (lexString s) where { lex1 vu55 = lex10 vu55; ; lex10 (str,t) = ('"' : str,t) : []; lex10 xw = []; ; lexStrItem (wzz : xux) = lexStrItem7 (wzz : xux); lexStrItem (wyx : wzu) = lexStrItem4 (wyx : wzu); lexStrItem s = lexStrItem1 s; ; lexStrItem0 vu58 = lexStrItem00 vu58; ; lexStrItem00 (xvy : t) = lexStrItem002 (xvy : t); lexStrItem00 xv = lexStrItem000 xv; ; lexStrItem000 xv = []; ; lexStrItem001 True (xvy : t) = ([],t) : []; lexStrItem001 xvz xwu = lexStrItem000 xwu; ; lexStrItem002 (xvy : t) = lexStrItem001 (xvy == '\') (xvy : t); lexStrItem002 xwv = lexStrItem000 xwv; ; lexStrItem1 s = lexLitChar s; ; lexStrItem2 wyx c s True = concatMap lexStrItem0 (dropWhile isSpace s : []); lexStrItem2 wyx c s False = lexStrItem1 (wyx : c : s); ; lexStrItem3 True (wyx : c : s) = lexStrItem2 wyx c s (isSpace c); lexStrItem3 wzv wzw = lexStrItem1 wzw; ; lexStrItem4 (wyx : wzu) = lexStrItem3 (wyx == '\') (wyx : wzu); lexStrItem4 wzx = lexStrItem1 wzx; ; lexStrItem5 True (wzz : xuv : s) = ('\' : '&' : [],s) : []; lexStrItem5 xuy xuz = lexStrItem4 xuz; ; lexStrItem6 True (wzz : xuv : s) = lexStrItem5 (xuv == '&') (wzz : xuv : s); lexStrItem6 xvu xvv = lexStrItem4 xvv; ; lexStrItem7 (wzz : xux) = lexStrItem6 (wzz == '\') (wzz : xux); lexStrItem7 xvw = lexStrItem4 xvw; ; lexString (wxy : s) = lexString4 (wxy : s); lexString s = lexString2 s; ; lexString0 ch vu56 = lexString00 ch vu56; ; lexString00 ch (str,u) = (ch ++ str,u) : []; lexString00 ch wz = []; ; lexString1 vu57 = lexString10 vu57; ; lexString10 (ch,t) = concatMap (lexString0 ch) (lexString t); lexString10 xu = []; ; lexString2 s = concatMap lexString1 (lexStrItem s); ; lexString3 True (wxy : s) = ('"' : [],s) : []; lexString3 wxz wyu = lexString2 wyu; ; lexString4 (wxy : s) = lexString3 (wxy == '"') (wxy : s); lexString4 wyv = lexString2 wyv; } " are unpacked to the following functions on top level "lex13Lex1 vu55 = lex13Lex10 vu55; " "lex13LexString00 ch (str,u) = (ch ++ str,u) : []; lex13LexString00 ch wz = []; " "lex13LexString2 s = concatMap lex13LexString1 (lex13LexStrItem s); " "lex13LexStrItem7 (wzz : xux) = lex13LexStrItem6 (wzz == '\') (wzz : xux); lex13LexStrItem7 xvw = lex13LexStrItem4 xvw; " "lex13LexString4 (wxy : s) = lex13LexString3 (wxy == '"') (wxy : s); lex13LexString4 wyv = lex13LexString2 wyv; " "lex13LexStrItem2 wyx c s True = concatMap lex13LexStrItem0 (dropWhile isSpace s : []); lex13LexStrItem2 wyx c s False = lex13LexStrItem1 (wyx : c : s); " "lex13LexStrItem4 (wyx : wzu) = lex13LexStrItem3 (wyx == '\') (wyx : wzu); lex13LexStrItem4 wzx = lex13LexStrItem1 wzx; " "lex13LexStrItem5 True (wzz : xuv : s) = ('\' : '&' : [],s) : []; lex13LexStrItem5 xuy xuz = lex13LexStrItem4 xuz; " "lex13LexStrItem1 s = lexLitChar s; " "lex13LexStrItem0 vu58 = lex13LexStrItem00 vu58; " "lex13LexStrItem001 True (xvy : t) = ([],t) : []; lex13LexStrItem001 xvz xwu = lex13LexStrItem000 xwu; " "lex13LexStrItem6 True (wzz : xuv : s) = lex13LexStrItem5 (xuv == '&') (wzz : xuv : s); lex13LexStrItem6 xvu xvv = lex13LexStrItem4 xvv; " "lex13Lex10 (str,t) = ('"' : str,t) : []; lex13Lex10 xw = []; " "lex13LexStrItem (wzz : xux) = lex13LexStrItem7 (wzz : xux); lex13LexStrItem (wyx : wzu) = lex13LexStrItem4 (wyx : wzu); lex13LexStrItem s = lex13LexStrItem1 s; " "lex13LexStrItem002 (xvy : t) = lex13LexStrItem001 (xvy == '\') (xvy : t); lex13LexStrItem002 xwv = lex13LexStrItem000 xwv; " "lex13LexString1 vu57 = lex13LexString10 vu57; " "lex13LexString10 (ch,t) = concatMap (lex13LexString0 ch) (lex13LexString t); lex13LexString10 xu = []; " "lex13LexString3 True (wxy : s) = ('"' : [],s) : []; lex13LexString3 wxz wyu = lex13LexString2 wyu; " "lex13LexStrItem3 True (wyx : c : s) = lex13LexStrItem2 wyx c s (isSpace c); lex13LexStrItem3 wzv wzw = lex13LexStrItem1 wzw; " "lex13LexStrItem000 xv = []; " "lex13LexStrItem00 (xvy : t) = lex13LexStrItem002 (xvy : t); lex13LexStrItem00 xv = lex13LexStrItem000 xv; " "lex13LexString (wxy : s) = lex13LexString4 (wxy : s); lex13LexString s = lex13LexString2 s; " "lex13LexString0 ch vu56 = lex13LexString00 ch vu56; " The bindings of the following Let/Where expression "span1 p vxu vxv (p vxu) where { span0 p vxu vxv True = ([],vxu : vxv); ; span1 p vxu vxv True = (vxu : ys,zs); span1 p vxu vxv False = span0 p vxu vxv otherwise; ; vu43 = span p vxv; ; ys = ys0 vu43; ; ys0 (ys,vxx) = ys; ; zs = zs0 vu43; ; zs0 (vxw,zs) = zs; } " are unpacked to the following functions on top level "span2Span0 vuwx vuwy p vxu vxv True = ([],vxu : vxv); " "span2Zs0 vuwx vuwy (vxw,zs) = zs; " "span2Zs vuwx vuwy = span2Zs0 vuwx vuwy (span2Vu43 vuwx vuwy); " "span2Ys vuwx vuwy = span2Ys0 vuwx vuwy (span2Vu43 vuwx vuwy); " "span2Ys0 vuwx vuwy (ys,vxx) = ys; " "span2Span1 vuwx vuwy p vxu vxv True = (vxu : span2Ys vuwx vuwy,span2Zs vuwx vuwy); span2Span1 vuwx vuwy p vxu vxv False = span2Span0 vuwx vuwy p vxu vxv otherwise; " "span2Vu43 vuwx vuwy = span vuwx vuwy; " The bindings of the following Let/Where expression "lex11 c s (isSingle c) where { isIdChar c = isAlphaNum c || c `elem` '_' : ''' : []; ; isSingle c = c `elem` ',' : ';' : '(' : ')' : '[' : ']' : '{' : '}' : '_' : '`' : []; ; isSym c = c `elem` '!' : '@' : '#' : '$' : '%' : '&' : '*' : '+' : '.' : '/' : '<' : '=' : '>' : '?' : '\' : '^' : '|' : ':' : '-' : '~' : []; ; lex11 c s True = (c : [],s) : []; lex11 c s False = lex9 c s (isSym c); ; lex2 c vu59 = lex20 c vu59; ; lex20 c (sym,t) = (c : sym,t) : []; lex20 c yy = []; ; lex3 c vu60 = lex30 c vu60; ; lex30 c (nam,t) = (c : nam,t) : []; lex30 c yz = []; ; lex4 c ds vu61 = lex40 c ds vu61; ; lex40 c ds (fe,t) = (c : ds ++ fe,t) : []; lex40 c ds yw = []; ; lex5 c vu62 = lex50 c vu62; ; lex50 c (ds,s) = concatMap (lex4 c ds) (lexFracExp s); lex50 c yx = []; ; lex6 c s True = []; ; lex7 c s True = concatMap (lex5 c) (span isDigit s : []); lex7 c s False = lex6 c s otherwise; ; lex8 c s True = concatMap (lex3 c) (span isIdChar s : []); lex8 c s False = lex7 c s (isDigit c); ; lex9 c s True = concatMap (lex2 c) (span isSym s : []); lex9 c s False = lex8 c s (isAlpha c); ; lexExp (e : s) = lexExp5 (e : s); lexExp s = lexExp3 s; ; lexExp0 e c vu65 = lexExp00 e c vu65; ; lexExp00 e c (ds,u) = (e : c : ds,u) : []; lexExp00 e c xx = []; ; lexExp1 e vu66 = lexExp10 e vu66; ; lexExp10 e (c : t) = lexExp100 e c t (c `elem` '+' : '-' : []); lexExp10 e xz = []; ; lexExp100 e c t True = concatMap (lexExp0 e c) (lexDigits t); lexExp100 e c t False = []; ; lexExp2 e vu67 = lexExp20 e vu67; ; lexExp20 e (ds,t) = (e : ds,t) : []; lexExp20 e xy = []; ; lexExp3 s = ([],s) : []; ; lexExp4 e s True = concatMap (lexExp1 e) (s : []) ++ concatMap (lexExp2 e) (lexDigits s); lexExp4 e s False = lexExp3 (e : s); ; lexExp5 (e : s) = lexExp4 e s (e `elem` 'e' : 'E' : []); lexExp5 xwx = lexExp3 xwx; ; lexFracExp (xwz : xxw) = lexFracExp5 (xwz : xxw); lexFracExp s = lexFracExp2 s; ; lexFracExp0 ds vu63 = lexFracExp00 ds vu63; ; lexFracExp00 ds (e,u) = ('.' : ds ++ e,u) : []; lexFracExp00 ds yv = []; ; lexFracExp1 vu64 = lexFracExp10 vu64; ; lexFracExp10 (ds,t) = concatMap (lexFracExp0 ds) (lexExp t); lexFracExp10 yu = []; ; lexFracExp2 s = lexExp s; ; lexFracExp3 xwz c cs True = concatMap lexFracExp1 (lexDigits (c : cs)); lexFracExp3 xwz c cs False = lexFracExp2 (xwz : c : cs); ; lexFracExp4 True (xwz : c : cs) = lexFracExp3 xwz c cs (isDigit c); lexFracExp4 xxx xxy = lexFracExp2 xxy; ; lexFracExp5 (xwz : xxw) = lexFracExp4 (xwz == '.') (xwz : xxw); lexFracExp5 xxz = lexFracExp2 xxz; } " are unpacked to the following functions on top level "lex12LexExp00 e c (ds,u) = (e : c : ds,u) : []; lex12LexExp00 e c xx = []; " "lex12Lex7 c s True = concatMap (lex12Lex5 c) (span isDigit s : []); lex12Lex7 c s False = lex12Lex6 c s otherwise; " "lex12Lex4 c ds vu61 = lex12Lex40 c ds vu61; " "lex12LexExp0 e c vu65 = lex12LexExp00 e c vu65; " "lex12Lex11 c s True = (c : [],s) : []; lex12Lex11 c s False = lex12Lex9 c s (lex12IsSym c); " "lex12LexFracExp4 True (xwz : c : cs) = lex12LexFracExp3 xwz c cs (isDigit c); lex12LexFracExp4 xxx xxy = lex12LexFracExp2 xxy; " "lex12LexFracExp3 xwz c cs True = concatMap lex12LexFracExp1 (lexDigits (c : cs)); lex12LexFracExp3 xwz c cs False = lex12LexFracExp2 (xwz : c : cs); " "lex12LexExp100 e c t True = concatMap (lex12LexExp0 e c) (lexDigits t); lex12LexExp100 e c t False = []; " "lex12LexExp (e : s) = lex12LexExp5 (e : s); lex12LexExp s = lex12LexExp3 s; " "lex12Lex8 c s True = concatMap (lex12Lex3 c) (span lex12IsIdChar s : []); lex12Lex8 c s False = lex12Lex7 c s (isDigit c); " "lex12LexFracExp0 ds vu63 = lex12LexFracExp00 ds vu63; " "lex12IsIdChar c = isAlphaNum c || c `elem` '_' : ''' : []; " "lex12LexExp20 e (ds,t) = (e : ds,t) : []; lex12LexExp20 e xy = []; " "lex12Lex50 c (ds,s) = concatMap (lex12Lex4 c ds) (lex12LexFracExp s); lex12Lex50 c yx = []; " "lex12LexFracExp5 (xwz : xxw) = lex12LexFracExp4 (xwz == '.') (xwz : xxw); lex12LexFracExp5 xxz = lex12LexFracExp2 xxz; " "lex12Lex30 c (nam,t) = (c : nam,t) : []; lex12Lex30 c yz = []; " "lex12Lex20 c (sym,t) = (c : sym,t) : []; lex12Lex20 c yy = []; " "lex12LexFracExp (xwz : xxw) = lex12LexFracExp5 (xwz : xxw); lex12LexFracExp s = lex12LexFracExp2 s; " "lex12Lex3 c vu60 = lex12Lex30 c vu60; " "lex12IsSingle c = c `elem` ',' : ';' : '(' : ')' : '[' : ']' : '{' : '}' : '_' : '`' : []; " "lex12Lex40 c ds (fe,t) = (c : ds ++ fe,t) : []; lex12Lex40 c ds yw = []; " "lex12Lex6 c s True = []; " "lex12Lex2 c vu59 = lex12Lex20 c vu59; " "lex12LexExp5 (e : s) = lex12LexExp4 e s (e `elem` 'e' : 'E' : []); lex12LexExp5 xwx = lex12LexExp3 xwx; " "lex12LexFracExp10 (ds,t) = concatMap (lex12LexFracExp0 ds) (lex12LexExp t); lex12LexFracExp10 yu = []; " "lex12LexExp3 s = ([],s) : []; " "lex12IsSym c = c `elem` '!' : '@' : '#' : '$' : '%' : '&' : '*' : '+' : '.' : '/' : '<' : '=' : '>' : '?' : '\' : '^' : '|' : ':' : '-' : '~' : []; " "lex12LexFracExp1 vu64 = lex12LexFracExp10 vu64; " "lex12LexExp4 e s True = concatMap (lex12LexExp1 e) (s : []) ++ concatMap (lex12LexExp2 e) (lexDigits s); lex12LexExp4 e s False = lex12LexExp3 (e : s); " "lex12LexFracExp2 s = lex12LexExp s; " "lex12Lex9 c s True = concatMap (lex12Lex2 c) (span lex12IsSym s : []); lex12Lex9 c s False = lex12Lex8 c s (isAlpha c); " "lex12LexFracExp00 ds (e,u) = ('.' : ds ++ e,u) : []; lex12LexFracExp00 ds yv = []; " "lex12Lex5 c vu62 = lex12Lex50 c vu62; " "lex12LexExp1 e vu66 = lex12LexExp10 e vu66; " "lex12LexExp2 e vu67 = lex12LexExp20 e vu67; " "lex12LexExp10 e (c : t) = lex12LexExp100 e c t (c `elem` '+' : '-' : []); lex12LexExp10 e xz = []; " The bindings of the following Let/Where expression "readParen0 b where { mandatory r = concatMap mandatory2 (lex r); ; mandatory0 x vu48 = mandatory00 x vu48; ; mandatory00 x (zuz : zvu,u) = mandatory002 x (zuz : zvu,u); mandatory00 x vuz = mandatory000 x vuz; ; mandatory000 x vuz = []; ; mandatory001 True x (zuz : [],u) = (x,u) : []; mandatory001 zvv zvw zvx = mandatory000 zvw zvx; ; mandatory002 x (zuz : zvu,u) = mandatory001 (zuz == ')') x (zuz : zvu,u); mandatory002 zvy zvz = mandatory000 zvy zvz; ; mandatory1 vu49 = mandatory10 vu49; ; mandatory10 (x,t) = concatMap (mandatory0 x) (lex t); mandatory10 vvu = []; ; mandatory2 vu50 = mandatory20 vu50; ; mandatory20 (yzy : yzz,s) = mandatory202 (yzy : yzz,s); mandatory20 vuy = mandatory200 vuy; ; mandatory200 vuy = []; ; mandatory201 True (yzy : [],s) = concatMap mandatory1 (optional s); mandatory201 zuu zuv = mandatory200 zuv; ; mandatory202 (yzy : yzz,s) = mandatory201 (yzy == '(') (yzy : yzz,s); mandatory202 zuw = mandatory200 zuw; ; optional r = g r ++ mandatory r; ; readParen0 True = mandatory; readParen0 False = optional; } " are unpacked to the following functions on top level "readParenMandatory002 vuwz x (zuz : zvu,u) = readParenMandatory001 vuwz (zuz == ')') x (zuz : zvu,u); readParenMandatory002 vuwz zvy zvz = readParenMandatory000 vuwz zvy zvz; " "readParenMandatory00 vuwz x (zuz : zvu,u) = readParenMandatory002 vuwz x (zuz : zvu,u); readParenMandatory00 vuwz x vuz = readParenMandatory000 vuwz x vuz; " "readParenMandatory202 vuwz (yzy : yzz,s) = readParenMandatory201 vuwz (yzy == '(') (yzy : yzz,s); readParenMandatory202 vuwz zuw = readParenMandatory200 vuwz zuw; " "readParenMandatory001 vuwz True x (zuz : [],u) = (x,u) : []; readParenMandatory001 vuwz zvv zvw zvx = readParenMandatory000 vuwz zvw zvx; " "readParenMandatory20 vuwz (yzy : yzz,s) = readParenMandatory202 vuwz (yzy : yzz,s); readParenMandatory20 vuwz vuy = readParenMandatory200 vuwz vuy; " "readParenMandatory200 vuwz vuy = []; " "readParenOptional vuwz r = vuwz r ++ readParenMandatory vuwz r; " "readParenMandatory2 vuwz vu50 = readParenMandatory20 vuwz vu50; " "readParenMandatory10 vuwz (x,t) = concatMap (readParenMandatory0 vuwz x) (lex t); readParenMandatory10 vuwz vvu = []; " "readParenMandatory vuwz r = concatMap (readParenMandatory2 vuwz) (lex r); " "readParenReadParen0 vuwz True = readParenMandatory vuwz; readParenReadParen0 vuwz False = readParenOptional vuwz; " "readParenMandatory000 vuwz x vuz = []; " "readParenMandatory0 vuwz x vu48 = readParenMandatory00 vuwz x vu48; " "readParenMandatory201 vuwz True (yzy : [],s) = concatMap (readParenMandatory1 vuwz) (readParenOptional vuwz s); readParenMandatory201 vuwz zuu zuv = readParenMandatory200 vuwz zuv; " "readParenMandatory1 vuwz vu49 = readParenMandatory10 vuwz vu49; " The bindings of the following Let/Where expression "getChar >>= getLine1 where { getLine0 c ls = return (c : ls); ; getLine1 c = getLine10 c (c == '\10'); ; getLine10 c True = return []; getLine10 c False = getRest >>= getLine0 c; ; getRest = catch getChar getRest0 >>= getRest2; ; getRest0 ex = getRest00 ex (isEOFError ex); ; getRest00 ex True = return '\10'; getRest00 ex False = ioError ex; ; getRest1 c cs = return (c : cs); ; getRest2 c = getRest20 c (c == '\10'); ; getRest20 c True = return []; getRest20 c False = getRest >>= getRest1 c; } " are unpacked to the following functions on top level "getLineGetRest0 ex = getLineGetRest00 ex (isEOFError ex); " "getLineGetLine0 c ls = return (c : ls); " "getLineGetRest2 c = getLineGetRest20 c (c == '\10'); " "getLineGetLine10 c True = return []; getLineGetLine10 c False = getLineGetRest >>= getLineGetLine0 c; " "getLineGetRest1 c cs = return (c : cs); " "getLineGetLine1 c = getLineGetLine10 c (c == '\10'); " "getLineGetRest00 ex True = return '\10'; getLineGetRest00 ex False = ioError ex; " "getLineGetRest = catch getChar getLineGetRest0 >>= getLineGetRest2; " "getLineGetRest20 c True = return []; getLineGetRest20 c False = getLineGetRest >>= getLineGetRest1 c; " ---------------------------------------- (12) Obligation: mainModule Main module Main where { import qualified Prelude; } ---------------------------------------- (13) NumRed (SOUND) Num Reduction:All numbers are transformed to their corresponding representation with Succ, Pred and Zero. ---------------------------------------- (14) Obligation: mainModule Main module Main where { import qualified Prelude; }