{-# LANGUAGE CPP #-}
{-# OPTIONS_HADDOCK hide #-}
#ifndef MAX_TUPLE_SIZE
#ifdef LARGE_TUPLES
#define MAX_TUPLE_SIZE 62
#else
#define MAX_TUPLE_SIZE 12
#endif
#endif
module Clash.CPP
( maxTupleSize
, fSuperStrict
, fStrictMapSignal
) where
maxTupleSize :: Num a => a
maxTupleSize = MAX_TUPLE_SIZE
fSuperStrict :: Bool
#ifdef CLASH_SUPER_STRICT
fSuperStrict = True
#else
fSuperStrict = False
#endif
{-# INLINE fSuperStrict #-}
fStrictMapSignal :: Bool
#ifdef CLASH_STRICT_MAPSIGNAL
fStrictMapSignal = True
#else
fStrictMapSignal = False
#endif
{-# INLINE fStrictMapSignal #-}