Skip to content
Snippets Groups Projects
Commit 75614c87 authored by chrg's avatar chrg
Browse files

Some improvements

parent 88d428ae
Branches
No related tags found
No related merge requests found
Showing
with 128453 additions and 247 deletions
......@@ -8,6 +8,7 @@
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE TupleSections #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE NoMonomorphismRestriction #-}
......@@ -38,6 +39,7 @@ import Data.Vector.Internal.Check (HasCallStack)
--
-- Todo stuckt names
import Control.Monad
import qualified Control.Monad.IRTree as IRTree
import Data.Monoid
import qualified Language.C as C
......@@ -182,7 +184,7 @@ reduceCExternalDeclaration r cont ctx = do
C.CDeclExt decl -> do
(decl', ctx') <- handleDecl decl ctx
case decl' of
Just d -> (pure (C.CDeclExt d) :) <$> cont ctx'
Just d -> ((C.CDeclExt <$> d) :) <$> cont ctx'
Nothing -> cont ctx'
_r -> don'tHandle r
......@@ -274,7 +276,9 @@ reduceCCompoundBlockItem r cont ctx = do
C.CBlockDecl declr -> do
(declr', ctx') <- handleDecl declr ctx
case declr' of
Just d -> (C.CBlockDecl d :) <$> cont ctx'
Just d -> do
d' <- (C.CBlockDecl <$> d)
(d' :) <$> cont ctx'
Nothing -> cont ctx'
a -> don'tHandle a
......@@ -282,7 +286,7 @@ handleDecl
:: (MonadReduce Lab m)
=> C.CDeclaration C.NodeInfo
-> Context
-> m (Maybe (C.CDeclaration C.NodeInfo), Context)
-> m (Maybe (m (C.CDeclaration C.NodeInfo)), Context)
handleDecl d ctx = case inlineTypeDefsCDeclaration d ctx of
-- A typedef
C.CDecl (C.CStorageSpec (C.CTypedef _) : rst) decl _ -> do
......@@ -290,34 +294,29 @@ handleDecl d ctx = case inlineTypeDefsCDeclaration d ctx of
split
("inline typedef " <> C.identToString ids, C.posOf d)
(pure (Nothing, addTypeDefs [ids] (ITInline rst) ctx))
(pure (Just d, addTypeDefs [ids] ITKeep ctx))
(pure (Just (pure d), addTypeDefs [ids] ITKeep ctx))
-- A const
C.CDecl spc decl ni' -> do
(decl', ctx') <- foldr reduceCDeclarationItem (pure ([], ctx)) decl
let fn = do
spc1 <- trySplit ("remove static", C.posOf ni') spc $ filter \case
C.CStorageSpec (C.CStatic _) -> False
_ow -> True
(decl', ctx') <- foldr reduceCDeclarationItem (pure ([], ctx)) decl
case (decl', structIds spc1) of
pure $ (C.CDecl spc1 decl' ni')
case (decl', structIds spc) of
([], [])
| AllowEmptyDeclarations `isIn` ctx' ->
split ("remove empty declaration", C.posOf d) (pure (Nothing, ctx')) do
pure (Just (C.CDecl spc1 decl' ni'), ctx')
pure (Just fn, ctx')
| otherwise -> pure (Nothing, ctx')
([], stcts) ->
split
("remove declaration", C.posOf d)
(pure (Nothing, foldr removeStruct ctx' stcts))
do
pure
( Just (C.CDecl spc1 decl' ni')
, foldr addStruct ctx' stcts
)
pure (Just fn, foldr addStruct ctx' stcts)
(_, stcts) ->
pure
( Just (C.CDecl spc1 decl' ni')
, foldr addStruct ctx' stcts
)
pure (Just fn, foldr addStruct ctx' stcts)
a -> don'tHandleWithPos a
reduceCDeclarationItem
:: (MonadReduce Lab m)
......@@ -335,20 +334,40 @@ reduceCDeclarationItem d ma = case d of
("inline variable " <> C.identToString i, C.posOf ni)
(pure (ds, addInlineExpr i (IEInline c') ctx))
( pure
( inlineTypeDefsCDI (C.CDeclarationItem dr (Just (C.CInitExpr c' ni')) Nothing) ctx : ds
( inlineTypeDefsCDI (C.CDeclarationItem dr (Just (C.CInitExpr c' ni')) Nothing) ctx
: ds
, addInlineExpr i IEKeep ctx
)
)
C.CDeclarationItem (C.CDeclr (Just i) _ Nothing _ ni) _ Nothing -> do
C.CDeclarationItem (C.CDeclr (Just i) a Nothing b ni) ex Nothing -> do
(ds, ctx) <- ma
ex' <- case ex of
Just ix -> maybeSplit ("remove initializer", C.posOf ni) (reduceCInitializer ix ctx)
Nothing -> pure Nothing
let d' = C.CDeclarationItem (C.CDeclr (Just i) a Nothing b ni) ex' Nothing
split
("remove variable " <> C.identToString i, C.posOf ni)
(pure (ds, addInlineExpr i IEDelete ctx))
(pure (inlineTypeDefsCDI d ctx : ds, addInlineExpr i IEKeep ctx))
(pure (inlineTypeDefsCDI d' ctx : ds, addInlineExpr i IEKeep ctx))
a@(C.CDeclarationItem (C.CDeclr _ _ _ _ ni) _ _) -> do
don'tHandleWithNodeInfo a ni
a -> don'tHandle a
reduceCInitializer
:: (MonadReduce Lab m)
=> C.CInitializer C.NodeInfo
-> Context
-> Maybe (m (C.CInitializer C.NodeInfo))
reduceCInitializer a ctx = case a of
C.CInitExpr e ni' -> do
rm <- reduceCExpr e ctx
Just $ (`C.CInitExpr` ni') <$> rm
C.CInitList (C.CInitializerList items) ni -> do
ritems <- forM items \case
([], it) -> fmap ([],) <$> reduceCInitializer it ctx
(as, _) -> notSupportedYet (fmap noinfo as) ni
Just $ (`C.CInitList` ni) . C.CInitializerList <$> sequence ritems
reduceCStatementOrEmptyBlock
:: (MonadReduce Lab m, HasCallStack)
=> C.CStatement C.NodeInfo
......@@ -580,8 +599,10 @@ reduceCExpr expr ctx = case expr of
e1' <- re1
e2' <- reduceCExprOrZero e2 ctx
pure $ C.CIndex e1' e2' ni
C.CComma items ni -> Just do
C.CComma items ni -> do
let Just (x, rst) = List.uncons (reverse items)
rx <- reduceCExpr x ctx
Just do
rst' <-
foldr
( \e cc -> do
......@@ -591,7 +612,7 @@ reduceCExpr expr ctx = case expr of
)
(pure [])
rst
x' <- reduceCExprOrZero x ctx
x' <- rx
if List.null rst'
then pure x'
else pure $ C.CComma (reverse (x' : rst')) ni
......@@ -659,6 +680,12 @@ functionName :: C.CFunctionDef C.NodeInfo -> Maybe C.Ident
functionName = \case
C.CFunDef _ (C.CDeclr ix _ _ _ _) _ _ _ -> ix
notSupportedYet :: (HasCallStack, Show a) => a -> C.NodeInfo -> b
notSupportedYet a ni = error (show a <> " at " <> show (C.posOf ni))
noinfo :: (Functor f) => f C.NodeInfo -> f ()
noinfo a = a $> ()
don'tHandle :: (HasCallStack, Functor f, Show (f ())) => f C.NodeInfo -> b
don'tHandle f = error (show (f $> ()))
......
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
Source diff could not be displayed: it is too large. Options to address this: view the blob.
This diff is collapsed.
This diff is collapsed.
static short int g_153 = 0L;
static unsigned int g_154 = 3uL;
static short int g_158 = 0L;
static unsigned int g_159 = 0x5cc1ffd3L;
static unsigned int g_203 = 0xbd2ee514L;
static short int g_250 = 0x8c40L;
static unsigned int g_251 = 0xb89a725eL;
static unsigned char g_312 = 1uL;
static int g_316 = 0x123013cdL;
static unsigned int g_355 = 9uL;
static int g_356 = -1L;
......@@ -130,7 +122,7 @@ static long long int func_1(void)
}
(0x720fL == 0x14d4L, 0x1e7b790c5a96d6b6LL);
func_78(0);
if (g_158)
if (0L)
{
g_506 &= 0x387e3cdf10492640LL;
}
......@@ -140,12 +132,12 @@ static long long int func_1(void)
g_1103 += 1;
(-4L, 5);
((0x6d2bL, 12), g_1032[4]);
(g_203, 0);
((3 & g_356, 8L) ^ 4294967295uL) <= g_159 != g_312;
(0xbd2ee514L, 0);
((3 & g_356, 8L) ^ 4294967295uL) <= 0x5cc1ffd3L != 1uL;
(g_388.f0, 0xd95d3b69L);
(0x6d2bL, 12);
}
g_356 |= (0xbeL, 253uL) >= (((0x1bf0108eL ^ ((l_5 | (((l_2303[2] = g_2138, (0x5b5f2838L, 5uL) <= g_1935), 0xb2cL) == g_251, g_559[3])) == 0x870bf6b6L, 65527uL)) != g_1238, l_5) == g_559[6]);
g_356 |= (0xbeL, 253uL) >= (((0x1bf0108eL ^ ((l_5 | (((l_2303[2] = g_2138, (0x5b5f2838L, 5uL) <= g_1935), 0xb2cL) == 0xb89a725eL, g_559[3])) == 0x870bf6b6L, 65527uL)) != g_1238, l_5) == g_559[6]);
l_2354--;
++l_2358;
return g_1756[0][0][6];
......@@ -197,7 +189,6 @@ static unsigned char func_12(unsigned int p_13,
(g_388.f0, 0xd95d3b69L);
("index = [%d]\n", i);
0L < 0x16abL;
g_251 += 1;
{
int i, j, k;
return l_2080[g_316 + 1][g_316 + 1][g_316 + 5];
......@@ -214,7 +205,6 @@ static unsigned char func_12(unsigned int p_13,
("index = [%d][%d][%d]\n", i, j, k);
(func_78(0), 0x89ab98cfL);
g_506 &= 0x387e3cdf10492640LL;
g_159 += 1;
for (i = 0; i < 3; i++)
{
}
......@@ -223,8 +213,7 @@ static unsigned char func_12(unsigned int p_13,
1L;
(1uL, 0x5e27L);
(0x5b5f2838L, 5uL) <= g_1935;
g_251 += 1;
g_154;
3uL;
(65535uL, 9);
(func_51(((l_58, 3), 1L),
(func_22((g_1103 |= (func_59(p_15.f3 ^= 0x43772679L,
......@@ -236,22 +225,20 @@ static unsigned char func_12(unsigned int p_13,
g_1021[3]) && 0L, g_1021[3]);
g_388.f1 -= 1;
{
g_159 += 1;
g_159 += 1;
g_1109 ^= 0xface4f9578fc59a3LL <= 0x61490d3a8ca6555aLL;
}
(g_1021[g_388.f1 + 4], 0x8L);
((0xf01a30e9L != (0x3fe1L & g_250), g_316) || p_16.f0 || 8L, 0xc0e07cacadac72b0LL);
((0xf01a30e9L != (0x3fe1L & 0x8c40L), g_316) || p_16.f0 || 8L, 0xc0e07cacadac72b0LL);
(8L, 0x9ed3L);
(g_153, 0x1fL);
(0L, 0x1fL);
{
for (g_159 = 0; g_159 <= 3; g_159 += 1)
for (; 0x5cc1ffd3L <= 3;)
{
return g_754[4][9];
}
}
(65535uL, 9);
(0xaeL, g_203);
(0xaeL, 0xbd2ee514L);
((g_755[7], g_1109), 1uL);
(p_13, -1L & 1uL);
func_1();
......@@ -281,7 +268,6 @@ static unsigned char func_12(unsigned int p_13,
l_2298 ^= (18446744073709551612uL, ((l_2166 = l_2277[2]) ^ (p_16.f0 >= (p_15.f2 = (g_1238 > ((l_2277[2] < (((~l_2282[2].f3, 10), 0uL) ^ ((g_1032[4], (((l_2279[1][9][1] > 0uL ^ l_2279[2][1][0]) & g_559[4], 0) && l_2297) <= l_2167) && l_2282[2].f0 || 4294967295uL), 0x1eL), l_2242[0]) >= 3uL && l_65.f0) <= p_15.f0, l_2278) > l_2277[1] <= 4uL ^ p_15.f1 || l_2279[0][6][1]), l_2080[1][1][7]), g_388.f0));
}
(l_58, 3);
g_159 += 1;
(p_15.f1, g_559[6]);
(65535uL, 9);
1uL;
......@@ -318,11 +304,11 @@ static unsigned char func_41(int p_42,
unsigned char l_1943[8] = { 0xfcL, 0xfcL, 0xfcL, 0xfcL, 0xfcL, 0xfcL, 0xfcL, 0xfcL };
int i, j, k;
lbl_1950:
if (l_1480 != (g_420[1][7], ((((g_312 ^= (~((((l_1508 |= l_1507 = (g_754[1][9] ^= l_1480) <= (g_250 = 0x5a0aL <= ((l_1506 |= (p_44, (p_45 &= 0x9bL) < l_1480)) > l_1480 == p_44 ^ 1uL, p_46) == p_44, 15) | 0xe2L) && 0L, g_754[1][4]) == g_388.f1) < l_1480 & p_42) > 255uL, p_43) ^ 2uL, l_1480), p_44) > 0L, g_390), 0x96L)))
if (l_1480 != (g_420[1][7], (((l_1480, p_44) > 0L, g_390), 0x96L)))
{
int l_1509 = 0xcf0d3fa9L;
struct S0 l_1528 = { 0, 0L, -253, 2 };
l_1508 = (g_312, (0L < l_1509, p_44));
l_1508 = (1uL, (0L < l_1509, p_44));
l_1506 ^= ((l_1528.f0 = p_44 || (g_754[5][3], ((g_594 = 0L || (((((0x7dL, 6) | (p_42 | (p_42, (((g_1145[0] = l_1528, 0x95076570L) != (((((8uL ^ g_388.f3, 0xf4L), 0x13L), p_44), 12) != p_44) || 0x48774aaaL) > 2uL | l_1480, g_421[4][0][4]) || 0x61cbL)) >= 1L) >= p_43 || -3L, 0x77L), l_1507) || g_1109) && p_43, 10), p_46))) | p_42, l_1528.f1) == 2uL;
}
else
......@@ -346,12 +332,12 @@ lbl_1950:
{
unsigned int l_1566 = 2uL;
int l_1622 = 0x52d880b5L;
for (g_159 = 0; g_159 <= 3; g_159 += 1)
for (; 0x5cc1ffd3L <= 3;)
{
int l_1562 = 0xc5f11417L;
int l_1564[4][2] = { { 3L, 3L }, { 3L, 3L }, { 3L, 3L }, { 3L, 3L } };
int i, j;
if (g_420[g_159][p_44 + 4])
if (g_420[0x5cc1ffd3L][p_44 + 4])
break;
l_1566--;
return 1L;
......@@ -362,15 +348,15 @@ lbl_1950:
int i;
l_1570[0][1][2] = l_1569;
p_42 = g_1032[g_1241 + 8];
g_421[4][4][1] |= ((((g_1032[p_44 + 5], 1uL) || (g_388.f1, (p_42 & 1L, 7)), (l_1553.f2 = ((l_1581 = 0xc8d8L) != (1L ^ p_43, l_1569.f3), 0L) < 7L > 2uL, p_44) > g_390) > g_1021[3] & l_1566, 0), g_158) | p_42;
g_755[7] |= (p_44, (l_1561[1], ((((l_1570[0][1][2].f3, (+(g_1304 < ((l_1595 = -9L & p_44, g_388.f0) < (g_754[1][9] && g_750[0][3][0]))) & p_45) != g_355 | g_203), g_158), g_1109) | 5uL, 0)));
g_421[4][4][1] |= ((((g_1032[p_44 + 5], 1uL) || (g_388.f1, (p_42 & 1L, 7)), (l_1553.f2 = ((l_1581 = 0xc8d8L) != (1L ^ p_43, l_1569.f3), 0L) < 7L > 2uL, p_44) > g_390) > g_1021[3] & l_1566, 0), 0L) | p_42;
g_755[7] |= (p_44, (l_1561[1], ((((l_1570[0][1][2].f3, (+(g_1304 < ((l_1595 = -9L & p_44, g_388.f0) < (g_754[1][9] && g_750[0][3][0]))) & p_45) != g_355 | 0xbd2ee514L), 0L), g_1109) | 5uL, 0)));
}
for (p_43 = -30; p_43 >= 2; p_43 = (p_43, 6))
{
unsigned int l_1623 = 0x19f8f8abL;
signed char l_1651 = 0xc4L;
g_421[2][3][3] = ((g_153, (0xaeL, g_203)) > (l_1570[0][1][2].f2 ^ ((l_1561[1] = (((g_755[7] > (l_1622 = ((g_153 & ((p_44 < ((p_45 ^= l_1553.f2) & !(g_203, l_1566)) || g_420[3][6]) | p_42 || 0x4L) && 0uL, 0x58f7L), l_1566) == g_750[0][4][0]), p_46) ^ p_43, l_1623) | 0x0L, g_312)) | l_1595), 3) || l_1569.f3) | 1L;
p_42 ^= (g_754[1][0], ((p_43 < (l_1622 = 1uL, l_1553.f3 != (l_1565 ^= 0x27751b71cbb9ca87LL && 8L || (((((((g_388.f3 = 0x4258deeef776dbdbLL < (p_45 > (g_1145[0].f3 = 1uL))) <= g_203 < g_251, g_356), p_43) <= 0L, p_43) == 1uL, 0x66L) == l_1623 ^ l_1570[0][1][2].f0) != 3L, l_1553.f2))), g_754[2][4]), 0xc7L)) && p_43;
g_421[2][3][3] = ((0L, (0xaeL, 0xbd2ee514L)) > (l_1570[0][1][2].f2 ^ ((l_1561[1] = (((g_755[7] > (l_1622 = ((0L & ((p_44 < ((p_45 ^= l_1553.f2) & !l_1566) || g_420[3][6]) | p_42 || 0x4L) && 0uL, 0x58f7L), l_1566) == g_750[0][4][0]), p_46) ^ p_43, l_1623) | 0x0L, 1uL)) | l_1595), 3) || l_1569.f3) | 1L;
p_42 ^= (g_754[1][0], ((p_43 < (l_1622 = 1uL, l_1553.f3 != (l_1565 ^= 0x27751b71cbb9ca87LL && 8L || (((((((g_388.f3 = 0x4258deeef776dbdbLL < (p_45 > (g_1145[0].f3 = 1uL))) <= 0xbd2ee514L < 0xb89a725eL, g_356), p_43) <= 0L, p_43) == 1uL, 0x66L) == l_1623 ^ l_1570[0][1][2].f0) != 3L, l_1553.f2))), g_754[2][4]), 0xc7L)) && p_43;
g_755[1] = ((!(p_46 >= (l_1570[0][1][2].f1, p_46 > ((4L || +l_1570[0][1][2].f1) >= ((l_1622 = g_391 = (((l_1565 | ((g_1145[0], (((0xa8d8cfa5L, l_1623) == g_1145[0].f2, 0xe338L), 0x455d144caf2d42e0LL)) > 0x1dc56eae6a15fc71LL, 0uL) & g_1021[0], 1uL) ^ p_45, p_42), l_1622) > 0L >= l_1651) < 0x6eL, g_1021[3])) || l_1652[7][1]) != p_43) != l_1506, p_44), p_46);
}
}
......@@ -390,8 +376,7 @@ lbl_1944:
{
return g_754[4][9];
}
g_250 -= 1;
(65527uL, g_203);
(65527uL, 0xbd2ee514L);
(2L, 2);
(0x5b5f2838L, 5uL);
(!p_42, g_755[7]);
......@@ -413,7 +398,7 @@ static unsigned short int func_51(short int p_52,
int i, j, k;
9;
g_1304 += 1;
for (g_153 = -20; g_153 < 6; g_153 = (g_153, 1))
for (; 0L < 6;)
{
unsigned int l_1440 = 0x3482da34L;
int l_1452 = 0xb168be91L;
......@@ -431,7 +416,7 @@ static unsigned short int func_51(short int p_52,
}
;
p_55 -= 1;
g_356 |= (g_250, 12);
g_356 |= (0x8c40L, 12);
1L;
(l_1144.f2 = (g_594 = 0x925bL, 6), 0);
{
......@@ -452,7 +437,7 @@ static unsigned short int func_51(short int p_52,
}
g_1109 ^= 0xface4f9578fc59a3LL <= 0x61490d3a8ca6555aLL;
(0xbeL, 253uL);
for (g_153 = -20; g_153 < 6; g_153 = (g_153, 1))
for (; 0L < 6;)
{
unsigned int l_1440 = 0x3482da34L;
int l_1452 = 0xb168be91L;
......@@ -488,8 +473,8 @@ static unsigned short int func_51(short int p_52,
("index = [%d][%d][%d]\n", i, j, k);
{
}
(65527uL, g_203);
for (g_153 = -20; g_153 < 6; g_153 = (g_153, 1))
(65527uL, 0xbd2ee514L);
for (; 0L < 6;)
{
unsigned int l_1440 = 0x3482da34L;
int l_1452 = 0xb168be91L;
......@@ -504,7 +489,7 @@ static unsigned short int func_51(short int p_52,
;
g_1241 += 1;
(((l_1162, (((0x6d2bL, 12), g_1032[4]) > l_1162, -1L)) | g_755[6] && p_53) < l_1144.f3, p_55);
(252uL ^ g_251, 0x54eab2ce98b21cf8LL);
(252uL ^ 0xb89a725eL, 0x54eab2ce98b21cf8LL);
((((l_1162, (((0x6d2bL, 12), g_1032[4]) > l_1162, -1L)) | g_755[6] && p_53) < l_1144.f3, p_55) > 0xd8L <= 0x8a3aa13cL, p_54);
(2L, 2);
(2uL, 8);
......@@ -514,7 +499,7 @@ static unsigned short int func_51(short int p_52,
l_1427 = l_1479 = l_1427;
}
;
(g_203, 0);
(0xbd2ee514L, 0);
p_54 ^= p_53;
(~0x2L, 65535uL);
for (g_391 = -7; g_391 != 54; g_391++)
......@@ -553,7 +538,7 @@ static unsigned short int func_51(short int p_52,
p_55,
(~(l_1240.f0 < l_1362) && g_390, g_421[3][7][1]),
l_1427), 4294967295uL), p_54);
(!((l_1144, g_153 = ((+(p_55, g_154), 4), l_1240.f1)) & 1L) | p_55, 18446744073709551610uL);
18446744073709551610uL;
}
{
(~g_388.f1, 0xdaL);
......@@ -571,7 +556,7 @@ static unsigned short int func_51(short int p_52,
int i;
(-1L, 1);
g_1109 ^= -1L;
(!((l_1144, g_153 = ((+(p_55, g_154), 4), l_1240.f1)) & 1L) | p_55, 18446744073709551610uL);
18446744073709551610uL;
l_1428 ^= ((func_59(l_1164 = 4294967289uL,
2uL,
p_55,
......@@ -605,7 +590,7 @@ static unsigned short int func_51(short int p_52,
}
}
((p_52, (l_1176, 15)), 0);
(g_159, 8);
(0x5cc1ffd3L, 8);
{
int l_1164 = -2L;
unsigned int l_1176 = 18446744073709551615uL;
......@@ -664,15 +649,14 @@ static struct S0 func_59(unsigned int p_60,
{
}
(0x5cL, (0xd7eeL, 14));
g_158 -= 1;
((1uL, g_420[2][1] < p_64.f3), p_64.f0);
(g_153, 1);
(g_153, 1);
(0L, 1);
(0L, 1);
(p_61 >= p_61, 7);
(g_1756[0][0][6] || 0x96ae7fbL, 13);
(((0xffL && p_61) | g_153, 0), 0x9350L);
(((0xffL && p_61) | 0L, 0), 0x9350L);
lbl_903:
for (g_250 = -5; g_250 == 28; g_250++)
for (; 0x8c40L == 28;)
{
short int l_604 = 0xb5c8L;
int l_605 = 0xb57bc166L;
......@@ -680,10 +664,9 @@ lbl_903:
break;
if (p_62)
break;
p_64.f2 = (p_64.f3, (g_158 = 0L) <= ((l_163.f2 && (g_559[7] && (g_388.f0 = 2uL)) < ((((0xffL && p_61) | g_153, 0), 0x9350L), l_163.f1)) != 5L | p_62)) && l_75;
l_606--;
}
((18446744073709551608uL, l_84[1][0] >= ((((((((p_64.f1, ((65534uL, g_594 = (~l_163.f1, g_153) > 0x3b4629f6L), p_62)), 0x2de3a813L) && l_81, g_355) > 0x41687dfaaf6ebba7LL < -10L, 1L), l_163.f3), l_81), 1L), 0x3674L)), g_355);
((18446744073709551608uL, l_84[1][0] >= ((((((((p_64.f1, ((65534uL, g_594 = (~l_163.f1, 0L) > 0x3b4629f6L), p_62)), 0x2de3a813L) && l_81, g_355) > 0x41687dfaaf6ebba7LL < -10L, 1L), l_163.f3), l_81), 1L), 0x3674L)), g_355);
(g_355, 1);
(g_754[2][3], 0);
if (g_316)
......@@ -691,11 +674,10 @@ lbl_903:
(247uL, 0x85L);
(-4L, 5);
0L < 0x16abL;
g_251 += 1;
1uL;
if (g_316)
goto lbl_903;
(((((p_64.f1, ((65534uL, g_594 = (~l_163.f1, g_153) > 0x3b4629f6L), p_62)), 0x2de3a813L) && l_81, g_355) > 0x41687dfaaf6ebba7LL < -10L, 1L), l_163.f3);
(((((p_64.f1, ((65534uL, g_594 = (~l_163.f1, 0L) > 0x3b4629f6L), p_62)), 0x2de3a813L) && l_81, g_355) > 0x41687dfaaf6ebba7LL < -10L, 1L), l_163.f3);
g_506 <= (g_388.f1 < g_420[1][5]);
return p_64;
}
......@@ -719,7 +701,7 @@ static int func_66(unsigned short int p_67, struct S0 p_68)
(0xbeL, 253uL);
("index = [%d][%d][%d]\n", i, j, k);
(0x89ab98cfL, 1);
((g_158, 12) == 0x70b449b74578e65aLL, 2);
((0L, 12) == 0x70b449b74578e65aLL, 2);
{
}
(g_755[5] < (0x70e0L != ((g_755[7], g_1109), 1uL) || g_1145[0].f2), 2);
......@@ -731,11 +713,11 @@ static int func_66(unsigned short int p_67, struct S0 p_68)
}
;
(0xd7eeL, 14);
((g_158, 12) == 0x70b449b74578e65aLL, 2);
((0L, 12) == 0x70b449b74578e65aLL, 2);
0L < 0x16abL;
g_506 &= 0x387e3cdf10492640LL;
func_22(0);
(g_203, 0);
(0xbd2ee514L, 0);
(0xacL, 1);
((g_388.f0, 0xd95d3b69L), (g_1032[4], 0x46L));
(1uL, 0x5e27L);
......@@ -745,16 +727,14 @@ static int func_66(unsigned short int p_67, struct S0 p_68)
(0x89ab98cfL, 1);
(0xbeL, 253uL);
l_168 += 1;
(252uL ^ g_251, 0x54eab2ce98b21cf8LL);
(252uL ^ 0xb89a725eL, 0x54eab2ce98b21cf8LL);
{
}
g_251 += 1;
(g_388.f3, 7uL);
(252uL ^ g_251, 0x54eab2ce98b21cf8LL);
(252uL ^ 0xb89a725eL, 0x54eab2ce98b21cf8LL);
(l_168, 7);
("index = [%d]\n", i);
(2L, 2);
g_251 += 1;
{
(0xf0L <= (g_391 = g_559[6]), g_755[3]);
(g_355, 1);
......@@ -778,7 +758,7 @@ static int func_66(unsigned short int p_67, struct S0 p_68)
for (k = 0; k < 8; k++)
l_512[i][j][k] = 0x3331d5d9L;
g_1304 += 1;
(g_250, 12);
(0x8c40L, 12);
14;
(1L, 251uL);
(8L, 0x9ed3L);
......@@ -798,10 +778,9 @@ static int func_71(unsigned char p_72,
{
(0xf0L <= (g_391 = g_559[6]), g_755[3]);
}
(g_250, 5);
(0x8c40L, 5);
{
}
g_251 += 1;
g_388.f1 -= 1;
0xa46d5f4f3d787ca5LL;
g_506 &= 0x387e3cdf10492640LL;
......@@ -819,15 +798,11 @@ static int func_71(unsigned char p_72,
(g_388.f3, 7uL);
g_1985 -= 1;
(0L > g_391, -9L);
g_159 += 1;
g_158 -= 1;
(1uL, 0x5e27L);
for (i = 0; i < 4; i++)
{
(l_145, 0x5dL);
g_391 |= g_312++;
}
g_251 += 1;
{
return 1L;
}
......@@ -838,7 +813,7 @@ static int func_71(unsigned char p_72,
g_754[1][9];
(g_1756[0][0][6] || 0x96ae7fbL, 13);
(0x5cL, (0xd7eeL, 14));
((3 & g_356, 8L) ^ 4294967295uL) <= g_159 != g_312;
((3 & g_356, 8L) ^ 4294967295uL) <= 0x5cc1ffd3L != 1uL;
l_145;
return 0x89ab98cfL;
}
......@@ -852,7 +827,7 @@ static unsigned char func_78(unsigned int p_79)
long long int l_124[9] = { 0x184c74488338c196LL, 0x184c74488338c196LL, 0x184c74488338c196LL, 0x184c74488338c196LL, 0x184c74488338c196LL, 0x184c74488338c196LL, 0x184c74488338c196LL, 0x184c74488338c196LL, 0x184c74488338c196LL };
int i;
0xa46d5f4f3d787ca5LL;
for (g_159 = 0; g_159 <= 3; g_159 += 1)
for (; 0x5cc1ffd3L <= 3;)
{
return g_754[4][9];
}
......@@ -871,12 +846,10 @@ static unsigned char func_78(unsigned int p_79)
(g_755[5] < (0x70e0L != ((g_755[7], g_1109), 1uL) || g_1145[0].f2), 2);
(0xd7eeL, 14);
0x16abL;
(g_153, 0x1fL);
g_159 += 1;
(0L, 0x1fL);
(func_78(0), 0x89ab98cfL);
g_159 += 1;
(g_1756[0][0][6] || 0x96ae7fbL, 13);
(g_203, 0);
(0xbd2ee514L, 0);
{
{
}
......@@ -887,7 +860,7 @@ static unsigned char func_78(unsigned int p_79)
}
(0xacL, 1);
0xa46d5f4f3d787ca5LL;
(g_250, 5);
(0x8c40L, 5);
return 65534uL;
}
int main(void)
......@@ -904,14 +877,14 @@ int main(void)
(0x89ab98cfL, "g_85", print_hash_value);
(2uL, "g_86", print_hash_value);
(1L, "g_131", print_hash_value);
(g_153, "g_153", print_hash_value);
(g_154, "g_154", print_hash_value);
(g_158, "g_158", print_hash_value);
(g_159, "g_159", print_hash_value);
(g_203, "g_203", print_hash_value);
(g_250, "g_250", print_hash_value);
(g_251, "g_251", print_hash_value);
(g_312, "g_312", print_hash_value);
(0L, "g_153", print_hash_value);
(3uL, "g_154", print_hash_value);
(0L, "g_158", print_hash_value);
(0x5cc1ffd3L, "g_159", print_hash_value);
(0xbd2ee514L, "g_203", print_hash_value);
(0x8c40L, "g_250", print_hash_value);
(0xb89a725eL, "g_251", print_hash_value);
(1uL, "g_312", print_hash_value);
(g_316, "g_316", print_hash_value);
(g_355, "g_355", print_hash_value);
(g_356, "g_356", print_hash_value);
......
int main(void)
{
(2uL, "g_86", 0);
(1L, "g_131", 0);
(0L, "g_153", 0);
(3uL, "g_154", 0);
(0L, "g_158", 0);
(0x5cc1ffd3L, "g_159", 0);
(0xbd2ee514L, "g_203", 0);
(0x8c40L, "g_250", 0);
(0xb89a725eL, "g_251", 0);
(1uL, "g_312", 0);
(0x123013cdL, "g_316", 0);
(9uL, "g_355", 0);
(1L, "g_356", 0);
("g_388.f0", 0);
("g_388.f1", 0);
("g_388.f2", 0);
("g_388.f3", 0);
(1L, "g_390", 0);
(255uL, "g_391", 0);
for (;;)
{
for (;;)
{
("g_420[i][j]", 0);
if (0)
"index = [%d][%d]\n";
}
}
for (;;)
{
for (;;)
{
for (;;)
{
("g_421[i][j][k]", 0);
if (0)
"index = [%d][%d][%d]\n";
}
}
}
(0uL, "g_506", 0);
for (;;)
{
("g_559[i]", 0);
if (0)
"index = [%d]\n";
}
(1L, "g_594", 0);
for (;;)
{
for (;;)
{
for (;;)
{
("g_750[i][j][k]", 0);
if (0)
"index = [%d][%d][%d]\n";
}
}
}
for (;;)
{
for (;;)
{
("g_754[i][j]", 0);
if (0)
"index = [%d][%d]\n";
}
}
for (;;)
{
("g_755[i]", 0);
if (0)
"index = [%d]\n";
}
for (;;)
{
("g_1021[i]", 0);
if (0)
"index = [%d]\n";
}
(1L, "g_1031", 0);
for (;;)
{
("g_1032[i]", 0);
if (0)
"index = [%d]\n";
}
(0x44377efeL, "g_1103", 0);
(10L, "g_1109", 0);
for (;;)
{
("g_1145[i].f0", 0);
("g_1145[i].f1", 0);
("g_1145[i].f2", 0);
("g_1145[i].f3", 0);
if (0)
"index = [%d]\n";
}
(0xef73cdc07db9fd50LL, "g_1238", 0);
(1uL, "g_1241", 0);
(0uL, "g_1304", 0);
for (;;)
{
for (;;)
{
("g_1732[i][j]", 0);
if (0)
"index = [%d][%d]\n";
}
}
for (;;)
{
for (;;)
{
for (;;)
{
("g_1756[i][j][k]", 0);
if (0)
"index = [%d][%d][%d]\n";
}
}
}
(3uL, "g_1935", 0);
(0x4e20e02fb14d3adfLL, "g_1985", 0);
(0xe3d39b8fL, "g_2138", 0);
(0x2bL, "g_2239", 0);
(0x533c3544L, "g_2299", 0);
(1L, "g_2300", 0);
(0x91c31f8bL, "g_2342", 0);
(0xffffffffuL ^ 0xffffffffuL, 0);
return 0;
}
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Please register or to comment