{-# OPTIONS_GHC -w #-} {-# OPTIONS -fglasgow-exts -cpp #-} {-# OPTIONS -w #-} module HOpenPGP.Tools.Parser( parseTKExp, parsePExp ) where import Codec.Encryption.OpenPGP.Types import Data.Conduit.OpenPGP.Filter (Expr(..), UPredicate(..), UOp(..), OVar(..), OValue(..), SPVar(..), SPValue(..), PKPVar(..), PKPValue(..)) import HOpenPGP.Tools.Common (pkpGetPKVersion, pkpGetPKAlgo, pkpGetKeysize, pkpGetTimestamp, pkpGetFingerprint, pkpGetEOKI, tkUsingPKP, withReaderTK, tkGetUIDs, tkGetSubs, anyOrAll, anyReader, oGetTag, oGetLength, spGetSigVersion, spGetSigType, spGetPKAlgo, spGetHashAlgo, pUsingPKP, pUsingSP, maybeR) import HOpenPGP.Tools.Lexer import Control.Applicative (liftA2) import Codec.Encryption.OpenPGP.Fingerprint (eightOctetKeyID, fingerprint) import Codec.Encryption.OpenPGP.KeyInfo (pubkeySize) import Control.Error.Util (hush) import Control.Monad.Loops (allM, anyM) import Control.Monad.Trans.Reader (ask, reader, Reader, withReader) import Data.List (isInfixOf) import qualified Data.Array as Happy_Data_Array import qualified GHC.Exts as Happy_GHC_Exts import Control.Applicative(Applicative(..)) -- parser produced by Happy Version 1.19.4 newtype HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21 = HappyAbsSyn HappyAny #if __GLASGOW_HASKELL__ >= 607 type HappyAny = Happy_GHC_Exts.Any #else type HappyAny = forall a . a #endif happyIn5 :: t5 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn5 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn5 #-} happyOut5 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t5 happyOut5 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut5 #-} happyIn6 :: t6 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn6 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn6 #-} happyOut6 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t6 happyOut6 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut6 #-} happyIn7 :: t7 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn7 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn7 #-} happyOut7 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t7 happyOut7 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut7 #-} happyIn8 :: t8 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn8 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn8 #-} happyOut8 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t8 happyOut8 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut8 #-} happyIn9 :: t9 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn9 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn9 #-} happyOut9 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t9 happyOut9 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut9 #-} happyIn10 :: t10 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn10 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn10 #-} happyOut10 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t10 happyOut10 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut10 #-} happyIn11 :: t11 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn11 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn11 #-} happyOut11 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t11 happyOut11 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut11 #-} happyIn12 :: t12 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn12 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn12 #-} happyOut12 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t12 happyOut12 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut12 #-} happyIn13 :: t13 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn13 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn13 #-} happyOut13 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t13 happyOut13 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut13 #-} happyIn14 :: t14 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn14 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn14 #-} happyOut14 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t14 happyOut14 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut14 #-} happyIn15 :: t15 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn15 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn15 #-} happyOut15 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t15 happyOut15 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut15 #-} happyIn16 :: t16 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn16 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn16 #-} happyOut16 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t16 happyOut16 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut16 #-} happyIn17 :: t17 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn17 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn17 #-} happyOut17 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t17 happyOut17 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut17 #-} happyIn18 :: t18 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn18 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn18 #-} happyOut18 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t18 happyOut18 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut18 #-} happyIn19 :: t19 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn19 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn19 #-} happyOut19 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t19 happyOut19 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut19 #-} happyIn20 :: t20 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn20 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn20 #-} happyOut20 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t20 happyOut20 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut20 #-} happyIn21 :: t21 -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyIn21 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyIn21 #-} happyOut21 :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> t21 happyOut21 x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOut21 #-} happyInTok :: (Token) -> (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) happyInTok x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyInTok #-} happyOutTok :: (HappyAbsSyn t5 t6 t7 t8 t9 t10 t11 t12 t13 t14 t15 t16 t17 t18 t19 t20 t21) -> (Token) happyOutTok x = Happy_GHC_Exts.unsafeCoerce# x {-# INLINE happyOutTok #-} happyActOffsets :: HappyAddr happyActOffsets = HappyA# "\x0c\x00\x03\x00\xaa\x00\x00\x00\x00\x00\x01\x00\x00\x00\x00\x00\x00\x00\x03\x00\x8a\x00\x87\x00\x84\x00\x84\x00\x81\x00\x7e\x00\x7e\x00\x7b\x00\x7b\x00\x36\x00\x36\x00\x78\x00\xff\xff\x00\x00\x00\x00\xa4\x00\xfd\xff\x9c\x00\x0c\x00\x55\x00\xa5\x00\x74\x00\xa3\x00\xfe\xff\x0c\x00\x0c\x00\x9d\x00\x00\x00\x00\x00\x00\x00\x73\x00\x00\x00\x00\x00\x71\x00\x9b\x00\x00\x00\x00\x00\x00\x00\x99\x00\xf6\xff\x00\x00\x00\x00\x00\x00\x49\x00\x11\x00\x29\x00\x97\x00\x96\x00\x94\x00\x54\x00\x03\x00\x03\x00\x54\x00\x54\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x3c\x00\x3c\x00\x00\x00\x6b\x00\x07\x00\x66\x00\x07\x00\x65\x00\x00\x00\x00\x00\x07\x00\x64\x00\x00\x00\x63\x00\x00\x00\x00\x00\x00\x00"# happyGotoOffsets :: HappyAddr happyGotoOffsets = HappyA# "\x82\x00\x72\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x6c\x00\x91\x00\x98\x00\x8d\x00\x70\x00\x76\x00\x6d\x00\x6a\x00\x69\x00\x59\x00\x67\x00\x5c\x00\x50\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x7f\x00\x00\x00\x00\x00\x00\x00\x00\x00\x45\x00\x6e\x00\x58\x00\x00\x00\x00\x00\x00\x00\x00\x00\x28\x00\x00\x00\x00\x00\x3d\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x1f\x00\x00\x00\x00\x00\x00\x00\x10\x00\x06\x00\x12\x00\x00\x00\x00\x00\x00\x00\x00\x00\x68\x00\x5e\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x17\x00\x00\x00\x16\x00\x00\x00\x00\x00\x00\x00\x02\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00"# happyDefActions :: HappyAddr happyDefActions = HappyA# "\x00\x00\x00\x00\x00\x00\x00\x00\xd7\xff\x00\x00\xd9\xff\xd8\xff\xdd\xff\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\xf9\xff\xf8\xff\x00\x00\xfd\xff\x00\x00\x00\x00\xfc\xff\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\xd4\xff\xd3\xff\xd2\xff\x00\x00\xe9\xff\xea\xff\x00\x00\x00\x00\xed\xff\xec\xff\xeb\xff\x00\x00\x00\x00\xcd\xff\xcc\xff\xcb\xff\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\xdc\xff\x00\x00\x00\x00\xda\xff\xdb\xff\xd6\xff\xf7\xff\xd1\xff\xd0\xff\xbc\xff\xca\xff\xc9\xff\xc8\xff\xc7\xff\xc6\xff\xc5\xff\xc4\xff\xc3\xff\xc2\xff\xc1\xff\xc0\xff\xbf\xff\xbe\xff\xbd\xff\xf6\xff\xe0\xff\xe6\xff\xe5\xff\xe4\xff\xe3\xff\xe2\xff\xe1\xff\xcf\xff\xb5\xff\xbb\xff\xba\xff\xb9\xff\xb8\xff\xb7\xff\xb6\xff\xce\xff\xad\xff\xb4\xff\xb3\xff\xb2\xff\xb1\xff\xb0\xff\xaf\xff\xae\xff\xf5\xff\xf4\xff\xf3\xff\xdf\xff\xf2\xff\xde\xff\xd5\xff\xfa\xff\xfb\xff\xee\xff\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\xe7\xff\xe8\xff\x00\x00\x00\x00\xef\xff\x00\x00\xf1\xff\xf0\xff"# happyCheck :: HappyAddr happyCheck = HappyA# "\xff\xff\x02\x00\x0c\x00\x02\x00\x07\x00\x08\x00\x03\x00\x05\x00\x09\x00\x06\x00\x09\x00\x04\x00\x06\x00\x01\x00\x0b\x00\x03\x00\x12\x00\x05\x00\x06\x00\x15\x00\x0d\x00\x12\x00\x13\x00\x14\x00\x15\x00\x16\x00\x17\x00\x05\x00\x05\x00\x0c\x00\x12\x00\x0f\x00\x0e\x00\x15\x00\x2c\x00\x2d\x00\x2e\x00\x2f\x00\x30\x00\x31\x00\x32\x00\x18\x00\x19\x00\x1a\x00\x1b\x00\x1c\x00\x1d\x00\x10\x00\x08\x00\x33\x00\x34\x00\x35\x00\x36\x00\x0c\x00\x33\x00\x34\x00\x35\x00\x36\x00\x04\x00\x3c\x00\x39\x00\x3c\x00\x02\x00\x33\x00\x34\x00\x35\x00\x36\x00\x0d\x00\x07\x00\x09\x00\x01\x00\x1e\x00\x1f\x00\x20\x00\x21\x00\x22\x00\x23\x00\x24\x00\x25\x00\x26\x00\x27\x00\x28\x00\x29\x00\x2a\x00\x2b\x00\x0c\x00\x02\x00\x02\x00\x00\x00\x01\x00\x02\x00\x0b\x00\x03\x00\x09\x00\x09\x00\x01\x00\x04\x00\x18\x00\x19\x00\x1a\x00\x1b\x00\x1c\x00\x1d\x00\x09\x00\x0a\x00\x01\x00\x0c\x00\x04\x00\x03\x00\x01\x00\x00\x00\x01\x00\x02\x00\x09\x00\x0a\x00\x01\x00\x0c\x00\x09\x00\x0a\x00\x0d\x00\x0c\x00\x03\x00\x0d\x00\x09\x00\x0a\x00\x0d\x00\x0c\x00\x00\x00\x01\x00\x02\x00\x00\x00\x01\x00\x02\x00\x0d\x00\x0e\x00\x0f\x00\x0d\x00\x0e\x00\x0f\x00\x0d\x00\x0e\x00\x0f\x00\x0d\x00\x0e\x00\x0f\x00\x0d\x00\x0e\x00\x0f\x00\x0d\x00\x0e\x00\x0f\x00\x0d\x00\x0e\x00\x0f\x00\x0d\x00\x03\x00\x0b\x00\x3a\x00\x3a\x00\x3a\x00\x0c\x00\x3b\x00\x0c\x00\x0c\x00\x08\x00\x0c\x00\x3b\x00\x0c\x00\x37\x00\x0c\x00\x07\x00\x38\x00\x07\x00\x03\x00\x0a\x00\x3b\x00\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff\xff"# happyTable :: HappyAddr happyTable = HappyA# "\x00\x00\x23\x00\x65\x00\x3d\x00\x20\x00\x21\x00\x09\x00\x7e\x00\x24\x00\x0a\x00\x3e\x00\x7c\x00\x53\x00\x1a\x00\x0b\x00\x1b\x00\x0c\x00\x1c\x00\x1d\x00\x0f\x00\x7d\x00\x0c\x00\x0d\x00\x0e\x00\x0f\x00\x10\x00\x11\x00\x80\x00\x7a\x00\x55\x00\x0c\x00\x5b\x00\x43\x00\x0f\x00\x66\x00\x67\x00\x68\x00\x69\x00\x6a\x00\x6b\x00\x6c\x00\x56\x00\x57\x00\x58\x00\x59\x00\x5a\x00\x5b\x00\x63\x00\x70\x00\x12\x00\x13\x00\x14\x00\x15\x00\x45\x00\x12\x00\x13\x00\x14\x00\x15\x00\x2a\x00\xff\xff\x16\x00\xff\xff\x23\x00\x12\x00\x13\x00\x14\x00\x15\x00\x2b\x00\x6e\x00\x24\x00\x75\x00\x46\x00\x47\x00\x48\x00\x49\x00\x4a\x00\x4b\x00\x4c\x00\x4d\x00\x4e\x00\x4f\x00\x50\x00\x51\x00\x52\x00\x53\x00\x5d\x00\x3d\x00\x23\x00\x73\x00\x17\x00\x18\x00\x24\x00\x2c\x00\x3e\x00\x24\x00\x04\x00\x28\x00\x5e\x00\x5f\x00\x60\x00\x61\x00\x62\x00\x63\x00\x3e\x00\x06\x00\x04\x00\x07\x00\x2b\x00\x30\x00\x04\x00\x74\x00\x17\x00\x18\x00\x3f\x00\x06\x00\x04\x00\x07\x00\x3b\x00\x06\x00\x31\x00\x07\x00\x36\x00\x35\x00\x05\x00\x06\x00\x37\x00\x07\x00\x1d\x00\x17\x00\x18\x00\x16\x00\x17\x00\x18\x00\x26\x00\x27\x00\x28\x00\x2e\x00\x2f\x00\x30\x00\x33\x00\x34\x00\x35\x00\x2e\x00\x2f\x00\x30\x00\x33\x00\x34\x00\x35\x00\x2e\x00\x2f\x00\x30\x00\x26\x00\x27\x00\x28\x00\x38\x00\x39\x00\x3a\x00\x82\x00\x83\x00\x80\x00\x41\x00\x7a\x00\x42\x00\x43\x00\x1f\x00\x6d\x00\x7e\x00\x6e\x00\x70\x00\x73\x00\x77\x00\x72\x00\x79\x00\x04\x00\x22\x00\x78\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00\x00"# happyReduceArr = Happy_Data_Array.array (2, 82) [ (2 , happyReduce_2), (3 , happyReduce_3), (4 , happyReduce_4), (5 , happyReduce_5), (6 , happyReduce_6), (7 , happyReduce_7), (8 , happyReduce_8), (9 , happyReduce_9), (10 , happyReduce_10), (11 , happyReduce_11), (12 , happyReduce_12), (13 , happyReduce_13), (14 , happyReduce_14), (15 , happyReduce_15), (16 , happyReduce_16), (17 , happyReduce_17), (18 , happyReduce_18), (19 , happyReduce_19), (20 , happyReduce_20), (21 , happyReduce_21), (22 , happyReduce_22), (23 , happyReduce_23), (24 , happyReduce_24), (25 , happyReduce_25), (26 , happyReduce_26), (27 , happyReduce_27), (28 , happyReduce_28), (29 , happyReduce_29), (30 , happyReduce_30), (31 , happyReduce_31), (32 , happyReduce_32), (33 , happyReduce_33), (34 , happyReduce_34), (35 , happyReduce_35), (36 , happyReduce_36), (37 , happyReduce_37), (38 , happyReduce_38), (39 , happyReduce_39), (40 , happyReduce_40), (41 , happyReduce_41), (42 , happyReduce_42), (43 , happyReduce_43), (44 , happyReduce_44), (45 , happyReduce_45), (46 , happyReduce_46), (47 , happyReduce_47), (48 , happyReduce_48), (49 , happyReduce_49), (50 , happyReduce_50), (51 , happyReduce_51), (52 , happyReduce_52), (53 , happyReduce_53), (54 , happyReduce_54), (55 , happyReduce_55), (56 , happyReduce_56), (57 , happyReduce_57), (58 , happyReduce_58), (59 , happyReduce_59), (60 , happyReduce_60), (61 , happyReduce_61), (62 , happyReduce_62), (63 , happyReduce_63), (64 , happyReduce_64), (65 , happyReduce_65), (66 , happyReduce_66), (67 , happyReduce_67), (68 , happyReduce_68), (69 , happyReduce_69), (70 , happyReduce_70), (71 , happyReduce_71), (72 , happyReduce_72), (73 , happyReduce_73), (74 , happyReduce_74), (75 , happyReduce_75), (76 , happyReduce_76), (77 , happyReduce_77), (78 , happyReduce_78), (79 , happyReduce_79), (80 , happyReduce_80), (81 , happyReduce_81), (82 , happyReduce_82) ] happy_n_terms = 61 :: Int happy_n_nonterms = 17 :: Int happyReduce_2 = happySpecReduce_1 0# happyReduction_2 happyReduction_2 happy_x_1 = happyIn5 (return True ) happyReduce_3 = happySpecReduce_2 0# happyReduction_3 happyReduction_3 happy_x_2 happy_x_1 = case happyOut5 happy_x_2 of { happy_var_2 -> happyIn5 (fmap not happy_var_2 )} happyReduce_4 = happySpecReduce_3 0# happyReduction_4 happyReduction_4 happy_x_3 happy_x_2 happy_x_1 = case happyOut5 happy_x_1 of { happy_var_1 -> case happyOut5 happy_x_3 of { happy_var_3 -> happyIn5 (liftA2 (&&) happy_var_1 happy_var_3 )}} happyReduce_5 = happySpecReduce_3 0# happyReduction_5 happyReduction_5 happy_x_3 happy_x_2 happy_x_1 = case happyOut5 happy_x_1 of { happy_var_1 -> case happyOut5 happy_x_3 of { happy_var_3 -> happyIn5 (liftA2 (||) happy_var_1 happy_var_3 )}} happyReduce_6 = happySpecReduce_1 0# happyReduction_6 happyReduction_6 happy_x_1 = case happyOut6 happy_x_1 of { happy_var_1 -> happyIn5 (tkUsingPKP happy_var_1 )} happyReduce_7 = happySpecReduce_1 0# happyReduction_7 happyReduction_7 happy_x_1 = case happyOut7 happy_x_1 of { happy_var_1 -> happyIn5 (happy_var_1 )} happyReduce_8 = happySpecReduce_3 1# happyReduction_8 happyReduction_8 happy_x_3 happy_x_2 happy_x_1 = case happyOut8 happy_x_2 of { happy_var_2 -> case happyOutTok happy_x_3 of { (TokenInt happy_var_3) -> happyIn6 (happy_var_2 (reader pkpGetPKVersion) (return happy_var_3) )}} happyReduce_9 = happySpecReduce_3 1# happyReduction_9 happyReduction_9 happy_x_3 happy_x_2 happy_x_1 = case happyOut8 happy_x_2 of { happy_var_2 -> case happyOut11 happy_x_3 of { happy_var_3 -> happyIn6 (happy_var_2 (reader pkpGetPKAlgo) (return happy_var_3) )}} happyReduce_10 = happySpecReduce_3 1# happyReduction_10 happyReduction_10 happy_x_3 happy_x_2 happy_x_1 = case happyOut8 happy_x_2 of { happy_var_2 -> case happyOutTok happy_x_3 of { (TokenInt happy_var_3) -> happyIn6 (happy_var_2 (reader pkpGetKeysize) (return happy_var_3) )}} happyReduce_11 = happySpecReduce_3 1# happyReduction_11 happyReduction_11 happy_x_3 happy_x_2 happy_x_1 = case happyOut8 happy_x_2 of { happy_var_2 -> case happyOutTok happy_x_3 of { (TokenInt happy_var_3) -> happyIn6 (happy_var_2 (reader pkpGetTimestamp) (return happy_var_3) )}} happyReduce_12 = happySpecReduce_3 1# happyReduction_12 happyReduction_12 happy_x_3 happy_x_2 happy_x_1 = case happyOut9 happy_x_2 of { happy_var_2 -> case happyOut12 happy_x_3 of { happy_var_3 -> happyIn6 (happy_var_2 (reader (show . pkpGetFingerprint)) (return happy_var_3) )}} happyReduce_13 = happySpecReduce_3 1# happyReduction_13 happyReduction_13 happy_x_3 happy_x_2 happy_x_1 = case happyOut9 happy_x_2 of { happy_var_2 -> case happyOut13 happy_x_3 of { happy_var_3 -> happyIn6 (happy_var_2 (reader pkpGetEOKI) (return happy_var_3) )}} happyReduce_14 = happyReduce 6# 2# happyReduction_14 happyReduction_14 (happy_x_6 `HappyStk` happy_x_5 `HappyStk` happy_x_4 `HappyStk` happy_x_3 `HappyStk` happy_x_2 `HappyStk` happy_x_1 `HappyStk` happyRest) = case happyOut10 happy_x_5 of { happy_var_5 -> case happyOutTok happy_x_6 of { (TokenStr happy_var_6) -> happyIn7 (withReader tkGetUIDs (anyOrAll allM (happy_var_5 (return happy_var_6))) ) `HappyStk` happyRest}} happyReduce_15 = happyReduce 6# 2# happyReduction_15 happyReduction_15 (happy_x_6 `HappyStk` happy_x_5 `HappyStk` happy_x_4 `HappyStk` happy_x_3 `HappyStk` happy_x_2 `HappyStk` happy_x_1 `HappyStk` happyRest) = case happyOut10 happy_x_5 of { happy_var_5 -> case happyOutTok happy_x_6 of { (TokenStr happy_var_6) -> happyIn7 (withReader tkGetUIDs (anyOrAll anyM (happy_var_5 (return happy_var_6))) ) `HappyStk` happyRest}} happyReduce_16 = happyReduce 5# 2# happyReduction_16 happyReduction_16 (happy_x_5 `HappyStk` happy_x_4 `HappyStk` happy_x_3 `HappyStk` happy_x_2 `HappyStk` happy_x_1 `HappyStk` happyRest) = case happyOut10 happy_x_4 of { happy_var_4 -> case happyOutTok happy_x_5 of { (TokenStr happy_var_5) -> happyIn7 (withReader tkGetUIDs (anyOrAll anyM (happy_var_4 (return happy_var_5))) ) `HappyStk` happyRest}} happyReduce_17 = happySpecReduce_3 2# happyReduction_17 happyReduction_17 happy_x_3 happy_x_2 happy_x_1 = case happyOut6 happy_x_3 of { happy_var_3 -> happyIn7 (withReader tkGetSubs (anyReader happy_var_3) )} happyReduce_18 = happySpecReduce_1 3# happyReduction_18 happyReduction_18 happy_x_1 = happyIn8 (liftA2 (==) ) happyReduce_19 = happySpecReduce_1 3# happyReduction_19 happyReduction_19 happy_x_1 = happyIn8 (liftA2 (<) ) happyReduce_20 = happySpecReduce_1 3# happyReduction_20 happyReduction_20 happy_x_1 = happyIn8 (liftA2 (>) ) happyReduce_21 = happySpecReduce_1 4# happyReduction_21 happyReduction_21 happy_x_1 = happyIn9 (liftA2 (==) ) happyReduce_22 = happySpecReduce_1 4# happyReduction_22 happyReduction_22 happy_x_1 = happyIn9 (liftA2 (flip isInfixOf) ) happyReduce_23 = happySpecReduce_1 5# happyReduction_23 happyReduction_23 happy_x_1 = happyIn10 (liftA2 (==) ) happyReduce_24 = happySpecReduce_1 5# happyReduction_24 happyReduction_24 happy_x_1 = happyIn10 (liftA2 isInfixOf ) happyReduce_25 = happySpecReduce_1 6# happyReduction_25 happyReduction_25 happy_x_1 = happyIn11 (fromIntegral (fromFVal RSA) ) happyReduce_26 = happySpecReduce_1 6# happyReduction_26 happyReduction_26 happy_x_1 = happyIn11 (fromIntegral (fromFVal DSA) ) happyReduce_27 = happySpecReduce_1 6# happyReduction_27 happyReduction_27 happy_x_1 = happyIn11 (fromIntegral (fromFVal ElgamalEncryptOnly) ) happyReduce_28 = happySpecReduce_1 6# happyReduction_28 happyReduction_28 happy_x_1 = happyIn11 (fromIntegral (fromFVal ECDSA) ) happyReduce_29 = happySpecReduce_1 6# happyReduction_29 happyReduction_29 happy_x_1 = happyIn11 (fromIntegral (fromFVal ECDH) ) happyReduce_30 = happySpecReduce_1 6# happyReduction_30 happyReduction_30 happy_x_1 = happyIn11 (fromIntegral (fromFVal DH) ) happyReduce_31 = happySpecReduce_1 6# happyReduction_31 happyReduction_31 happy_x_1 = case happyOutTok happy_x_1 of { (TokenInt happy_var_1) -> happyIn11 (fromIntegral happy_var_1 )} happyReduce_32 = happySpecReduce_1 7# happyReduction_32 happyReduction_32 happy_x_1 = case happyOutTok happy_x_1 of { (TokenFpr happy_var_1) -> happyIn12 (show happy_var_1 )} happyReduce_33 = happySpecReduce_1 8# happyReduction_33 happyReduction_33 happy_x_1 = case happyOutTok happy_x_1 of { (TokenLongID happy_var_1) -> happyIn13 (either (const "BROKEN") show happy_var_1 )} happyReduce_34 = happySpecReduce_1 9# happyReduction_34 happyReduction_34 happy_x_1 = happyIn14 (return True ) happyReduce_35 = happySpecReduce_2 9# happyReduction_35 happyReduction_35 happy_x_2 happy_x_1 = case happyOut14 happy_x_2 of { happy_var_2 -> happyIn14 (fmap not happy_var_2 )} happyReduce_36 = happySpecReduce_3 9# happyReduction_36 happyReduction_36 happy_x_3 happy_x_2 happy_x_1 = case happyOut14 happy_x_1 of { happy_var_1 -> case happyOut14 happy_x_3 of { happy_var_3 -> happyIn14 (liftA2 (&&) happy_var_1 happy_var_3 )}} happyReduce_37 = happySpecReduce_3 9# happyReduction_37 happyReduction_37 happy_x_3 happy_x_2 happy_x_1 = case happyOut14 happy_x_1 of { happy_var_1 -> case happyOut14 happy_x_3 of { happy_var_3 -> happyIn14 (liftA2 (||) happy_var_1 happy_var_3 )}} happyReduce_38 = happySpecReduce_1 9# happyReduction_38 happyReduction_38 happy_x_1 = case happyOut15 happy_x_1 of { happy_var_1 -> happyIn14 (happy_var_1 )} happyReduce_39 = happySpecReduce_1 9# happyReduction_39 happyReduction_39 happy_x_1 = case happyOut17 happy_x_1 of { happy_var_1 -> happyIn14 (happy_var_1 )} happyReduce_40 = happySpecReduce_1 9# happyReduction_40 happyReduction_40 happy_x_1 = case happyOut6 happy_x_1 of { happy_var_1 -> happyIn14 (pUsingPKP (maybeR True happy_var_1) )} happyReduce_41 = happySpecReduce_3 10# happyReduction_41 happyReduction_41 happy_x_3 happy_x_2 happy_x_1 = case happyOut16 happy_x_2 of { happy_var_2 -> case happyOutTok happy_x_3 of { (TokenInt happy_var_3) -> happyIn15 (happy_var_2 (reader oGetTag) (return happy_var_3) )}} happyReduce_42 = happySpecReduce_3 10# happyReduction_42 happyReduction_42 happy_x_3 happy_x_2 happy_x_1 = case happyOut16 happy_x_2 of { happy_var_2 -> case happyOutTok happy_x_3 of { (TokenInt happy_var_3) -> happyIn15 (happy_var_2 (reader oGetLength) (return happy_var_3) )}} happyReduce_43 = happySpecReduce_1 11# happyReduction_43 happyReduction_43 happy_x_1 = happyIn16 (liftA2 (==) ) happyReduce_44 = happySpecReduce_1 11# happyReduction_44 happyReduction_44 happy_x_1 = happyIn16 (liftA2 (<) ) happyReduce_45 = happySpecReduce_1 11# happyReduction_45 happyReduction_45 happy_x_1 = happyIn16 (liftA2 (>) ) happyReduce_46 = happySpecReduce_3 12# happyReduction_46 happyReduction_46 happy_x_3 happy_x_2 happy_x_1 = case happyOut18 happy_x_2 of { happy_var_2 -> case happyOutTok happy_x_3 of { (TokenInt happy_var_3) -> happyIn17 (happy_var_2 (reader spGetSigVersion) (return (Just happy_var_3)) )}} happyReduce_47 = happySpecReduce_3 12# happyReduction_47 happyReduction_47 happy_x_3 happy_x_2 happy_x_1 = case happyOut18 happy_x_2 of { happy_var_2 -> case happyOut19 happy_x_3 of { happy_var_3 -> happyIn17 (happy_var_2 (reader spGetSigType) (return (Just happy_var_3)) )}} happyReduce_48 = happySpecReduce_3 12# happyReduction_48 happyReduction_48 happy_x_3 happy_x_2 happy_x_1 = case happyOut18 happy_x_2 of { happy_var_2 -> case happyOut20 happy_x_3 of { happy_var_3 -> happyIn17 (happy_var_2 (reader spGetPKAlgo) (return (Just happy_var_3)) )}} happyReduce_49 = happySpecReduce_3 12# happyReduction_49 happyReduction_49 happy_x_3 happy_x_2 happy_x_1 = case happyOut18 happy_x_2 of { happy_var_2 -> case happyOut21 happy_x_3 of { happy_var_3 -> happyIn17 (happy_var_2 (reader spGetHashAlgo) (return (Just happy_var_3)) )}} happyReduce_50 = happySpecReduce_1 13# happyReduction_50 happyReduction_50 happy_x_1 = happyIn18 (liftA2 (==) ) happyReduce_51 = happySpecReduce_1 13# happyReduction_51 happyReduction_51 happy_x_1 = happyIn18 (liftA2 (<) ) happyReduce_52 = happySpecReduce_1 13# happyReduction_52 happyReduction_52 happy_x_1 = happyIn18 (liftA2 (>) ) happyReduce_53 = happySpecReduce_1 14# happyReduction_53 happyReduction_53 happy_x_1 = happyIn19 (fromIntegral (fromFVal BinarySig) ) happyReduce_54 = happySpecReduce_1 14# happyReduction_54 happyReduction_54 happy_x_1 = happyIn19 (fromIntegral (fromFVal CanonicalTextSig) ) happyReduce_55 = happySpecReduce_1 14# happyReduction_55 happyReduction_55 happy_x_1 = happyIn19 (fromIntegral (fromFVal StandaloneSig) ) happyReduce_56 = happySpecReduce_1 14# happyReduction_56 happyReduction_56 happy_x_1 = happyIn19 (fromIntegral (fromFVal GenericCert) ) happyReduce_57 = happySpecReduce_1 14# happyReduction_57 happyReduction_57 happy_x_1 = happyIn19 (fromIntegral (fromFVal PersonaCert) ) happyReduce_58 = happySpecReduce_1 14# happyReduction_58 happyReduction_58 happy_x_1 = happyIn19 (fromIntegral (fromFVal CasualCert) ) happyReduce_59 = happySpecReduce_1 14# happyReduction_59 happyReduction_59 happy_x_1 = happyIn19 (fromIntegral (fromFVal PositiveCert) ) happyReduce_60 = happySpecReduce_1 14# happyReduction_60 happyReduction_60 happy_x_1 = happyIn19 (fromIntegral (fromFVal SubkeyBindingSig) ) happyReduce_61 = happySpecReduce_1 14# happyReduction_61 happyReduction_61 happy_x_1 = happyIn19 (fromIntegral (fromFVal PrimaryKeyBindingSig) ) happyReduce_62 = happySpecReduce_1 14# happyReduction_62 happyReduction_62 happy_x_1 = happyIn19 (fromIntegral (fromFVal SignatureDirectlyOnAKey) ) happyReduce_63 = happySpecReduce_1 14# happyReduction_63 happyReduction_63 happy_x_1 = happyIn19 (fromIntegral (fromFVal KeyRevocationSig) ) happyReduce_64 = happySpecReduce_1 14# happyReduction_64 happyReduction_64 happy_x_1 = happyIn19 (fromIntegral (fromFVal SubkeyRevocationSig) ) happyReduce_65 = happySpecReduce_1 14# happyReduction_65 happyReduction_65 happy_x_1 = happyIn19 (fromIntegral (fromFVal CertRevocationSig) ) happyReduce_66 = happySpecReduce_1 14# happyReduction_66 happyReduction_66 happy_x_1 = happyIn19 (fromIntegral (fromFVal TimestampSig) ) happyReduce_67 = happySpecReduce_1 14# happyReduction_67 happyReduction_67 happy_x_1 = case happyOutTok happy_x_1 of { (TokenInt happy_var_1) -> happyIn19 (fromIntegral happy_var_1 )} happyReduce_68 = happySpecReduce_1 15# happyReduction_68 happyReduction_68 happy_x_1 = happyIn20 (fromIntegral (fromFVal RSA) ) happyReduce_69 = happySpecReduce_1 15# happyReduction_69 happyReduction_69 happy_x_1 = happyIn20 (fromIntegral (fromFVal DSA) ) happyReduce_70 = happySpecReduce_1 15# happyReduction_70 happyReduction_70 happy_x_1 = happyIn20 (fromIntegral (fromFVal ElgamalEncryptOnly) ) happyReduce_71 = happySpecReduce_1 15# happyReduction_71 happyReduction_71 happy_x_1 = happyIn20 (fromIntegral (fromFVal ECDSA) ) happyReduce_72 = happySpecReduce_1 15# happyReduction_72 happyReduction_72 happy_x_1 = happyIn20 (fromIntegral (fromFVal ECDH) ) happyReduce_73 = happySpecReduce_1 15# happyReduction_73 happyReduction_73 happy_x_1 = happyIn20 (fromIntegral (fromFVal DH) ) happyReduce_74 = happySpecReduce_1 15# happyReduction_74 happyReduction_74 happy_x_1 = case happyOutTok happy_x_1 of { (TokenInt happy_var_1) -> happyIn20 (fromIntegral happy_var_1 )} happyReduce_75 = happySpecReduce_1 16# happyReduction_75 happyReduction_75 happy_x_1 = happyIn21 (fromIntegral (fromFVal DeprecatedMD5) ) happyReduce_76 = happySpecReduce_1 16# happyReduction_76 happyReduction_76 happy_x_1 = happyIn21 (fromIntegral (fromFVal SHA1) ) happyReduce_77 = happySpecReduce_1 16# happyReduction_77 happyReduction_77 happy_x_1 = happyIn21 (fromIntegral (fromFVal RIPEMD160) ) happyReduce_78 = happySpecReduce_1 16# happyReduction_78 happyReduction_78 happy_x_1 = happyIn21 (fromIntegral (fromFVal SHA256) ) happyReduce_79 = happySpecReduce_1 16# happyReduction_79 happyReduction_79 happy_x_1 = happyIn21 (fromIntegral (fromFVal SHA384) ) happyReduce_80 = happySpecReduce_1 16# happyReduction_80 happyReduction_80 happy_x_1 = happyIn21 (fromIntegral (fromFVal SHA512) ) happyReduce_81 = happySpecReduce_1 16# happyReduction_81 happyReduction_81 happy_x_1 = happyIn21 (fromIntegral (fromFVal SHA224) ) happyReduce_82 = happySpecReduce_1 16# happyReduction_82 happyReduction_82 happy_x_1 = case happyOutTok happy_x_1 of { (TokenInt happy_var_1) -> happyIn21 (fromIntegral happy_var_1 )} happyNewToken action sts stk = lexwrap(\tk -> let cont i = happyDoAction i tk action sts stk in case tk of { TokenEOF -> happyDoAction 60# tk action sts stk; TokenA -> cont 1#; TokenAnd -> cont 2#; TokenAny -> cont 3#; TokenContains -> cont 4#; TokenEvery -> cont 5#; TokenNot -> cont 6#; TokenOf -> cont 7#; TokenOne -> cont 8#; TokenOr -> cont 9#; TokenSubkey -> cont 10#; TokenTag -> cont 11#; TokenInt happy_dollar_dollar -> cont 12#; TokenEq -> cont 13#; TokenLt -> cont 14#; TokenGt -> cont 15#; TokenLParen -> cont 16#; TokenRParen -> cont 17#; TokenPKVersion -> cont 18#; TokenSigVersion -> cont 19#; TokenSigType -> cont 20#; TokenPKAlgo -> cont 21#; TokenSigPKAlgo -> cont 22#; TokenHashAlgo -> cont 23#; TokenRSA -> cont 24#; TokenDSA -> cont 25#; TokenElgamal -> cont 26#; TokenECDSA -> cont 27#; TokenECDH -> cont 28#; TokenDH -> cont 29#; TokenBinary -> cont 30#; TokenCanonicalText -> cont 31#; TokenStandalone -> cont 32#; TokenGenericCert -> cont 33#; TokenPersonaCert -> cont 34#; TokenCasualCert -> cont 35#; TokenPositiveCert -> cont 36#; TokenSubkeyBindingSig -> cont 37#; TokenPrimaryKeyBindingSig -> cont 38#; TokenSignatureDirectlyOnAKey -> cont 39#; TokenKeyRevocationSig -> cont 40#; TokenSubkeyRevocationSig -> cont 41#; TokenCertRevocationSig -> cont 42#; TokenTimestampSig -> cont 43#; TokenMD5 -> cont 44#; TokenSHA1 -> cont 45#; TokenRIPEMD160 -> cont 46#; TokenSHA256 -> cont 47#; TokenSHA384 -> cont 48#; TokenSHA512 -> cont 49#; TokenSHA224 -> cont 50#; TokenKeysize -> cont 51#; TokenTimestamp -> cont 52#; TokenFingerprint -> cont 53#; TokenKeyID -> cont 54#; TokenFpr happy_dollar_dollar -> cont 55#; TokenLongID happy_dollar_dollar -> cont 56#; TokenLength -> cont 57#; TokenStr happy_dollar_dollar -> cont 58#; TokenUids -> cont 59#; _ -> happyError' tk }) happyError_ 60# tk = happyError' tk happyError_ _ tk = happyError' tk happyThen :: () => Alex a -> (a -> Alex b) -> Alex b happyThen = (>>=) happyReturn :: () => a -> Alex a happyReturn = (return) happyThen1 = happyThen happyReturn1 :: () => a -> Alex a happyReturn1 = happyReturn happyError' :: () => (Token) -> Alex a happyError' tk = happyError tk parseTK = happySomeParser where happySomeParser = happyThen (happyParse 0#) (\x -> happyReturn (happyOut5 x)) parseP = happySomeParser where happySomeParser = happyThen (happyParse 1#) (\x -> happyReturn (happyOut14 x)) happySeq = happyDontSeq lexwrap :: (Token -> Alex a) -> Alex a lexwrap cont = do t <- alexMonadScan' cont t alexMonadScan' = do inp <- alexGetInput sc <- alexGetStartCode case alexScan inp sc of AlexEOF -> alexEOF AlexError (pos, _, _, _) -> alexError (show pos) AlexSkip inp' len -> do alexSetInput inp' alexMonadScan' AlexToken inp' len action -> do alexSetInput inp' action (ignorePendingBytes inp) len getPosn :: Alex (Int,Int) getPosn = do (AlexPn _ l c,_,_,_) <- alexGetInput return (l,c) happyError :: Token -> Alex a happyError t = do (l,c) <- getPosn fail (show l ++ ":" ++ show c ++ ": Parse error on Token: " ++ show t ++ "\n") parseTKExp :: String -> Either String (Reader TK Bool) parseTKExp s = runAlex s parseTK parsePExp :: String -> Either String (Reader Pkt Bool) parsePExp s = runAlex s parseP {-# LINE 1 "templates/GenericTemplate.hs" #-} {-# LINE 1 "templates/GenericTemplate.hs" #-} {-# LINE 1 "" #-} {-# LINE 1 "" #-} {-# LINE 8 "" #-} # 1 "/usr/include/stdc-predef.h" 1 3 4 # 17 "/usr/include/stdc-predef.h" 3 4 {-# LINE 8 "" #-} {-# LINE 1 "templates/GenericTemplate.hs" #-} -- Id: GenericTemplate.hs,v 1.26 2005/01/14 14:47:22 simonmar Exp {-# LINE 13 "templates/GenericTemplate.hs" #-} -- Do not remove this comment. Required to fix CPP parsing when using GCC and a clang-compiled alex. #if __GLASGOW_HASKELL__ > 706 #define LT(n,m) ((Happy_GHC_Exts.tagToEnum# (n Happy_GHC_Exts.<# m)) :: Bool) #define GTE(n,m) ((Happy_GHC_Exts.tagToEnum# (n Happy_GHC_Exts.>=# m)) :: Bool) #define EQ(n,m) ((Happy_GHC_Exts.tagToEnum# (n Happy_GHC_Exts.==# m)) :: Bool) #else #define LT(n,m) (n Happy_GHC_Exts.<# m) #define GTE(n,m) (n Happy_GHC_Exts.>=# m) #define EQ(n,m) (n Happy_GHC_Exts.==# m) #endif {-# LINE 46 "templates/GenericTemplate.hs" #-} data Happy_IntList = HappyCons Happy_GHC_Exts.Int# Happy_IntList {-# LINE 67 "templates/GenericTemplate.hs" #-} {-# LINE 77 "templates/GenericTemplate.hs" #-} {-# LINE 86 "templates/GenericTemplate.hs" #-} infixr 9 `HappyStk` data HappyStk a = HappyStk a (HappyStk a) ----------------------------------------------------------------------------- -- starting the parse happyParse start_state = happyNewToken start_state notHappyAtAll notHappyAtAll ----------------------------------------------------------------------------- -- Accepting the parse -- If the current token is 0#, it means we've just accepted a partial -- parse (a %partial parser). We must ignore the saved token on the top of -- the stack in this case. happyAccept 0# tk st sts (_ `HappyStk` ans `HappyStk` _) = happyReturn1 ans happyAccept j tk st sts (HappyStk ans _) = (happyTcHack j (happyTcHack st)) (happyReturn1 ans) ----------------------------------------------------------------------------- -- Arrays only: do the next action happyDoAction i tk st = {- nothing -} case action of 0# -> {- nothing -} happyFail i tk st -1# -> {- nothing -} happyAccept i tk st n | LT(n,(0# :: Happy_GHC_Exts.Int#)) -> {- nothing -} (happyReduceArr Happy_Data_Array.! rule) i tk st where rule = (Happy_GHC_Exts.I# ((Happy_GHC_Exts.negateInt# ((n Happy_GHC_Exts.+# (1# :: Happy_GHC_Exts.Int#)))))) n -> {- nothing -} happyShift new_state i tk st where new_state = (n Happy_GHC_Exts.-# (1# :: Happy_GHC_Exts.Int#)) where off = indexShortOffAddr happyActOffsets st off_i = (off Happy_GHC_Exts.+# i) check = if GTE(off_i,(0# :: Happy_GHC_Exts.Int#)) then EQ(indexShortOffAddr happyCheck off_i, i) else False action | check = indexShortOffAddr happyTable off_i | otherwise = indexShortOffAddr happyDefActions st indexShortOffAddr (HappyA# arr) off = Happy_GHC_Exts.narrow16Int# i where i = Happy_GHC_Exts.word2Int# (Happy_GHC_Exts.or# (Happy_GHC_Exts.uncheckedShiftL# high 8#) low) high = Happy_GHC_Exts.int2Word# (Happy_GHC_Exts.ord# (Happy_GHC_Exts.indexCharOffAddr# arr (off' Happy_GHC_Exts.+# 1#))) low = Happy_GHC_Exts.int2Word# (Happy_GHC_Exts.ord# (Happy_GHC_Exts.indexCharOffAddr# arr off')) off' = off Happy_GHC_Exts.*# 2# data HappyAddr = HappyA# Happy_GHC_Exts.Addr# ----------------------------------------------------------------------------- -- HappyState data type (not arrays) {-# LINE 170 "templates/GenericTemplate.hs" #-} ----------------------------------------------------------------------------- -- Shifting a token happyShift new_state 0# tk st sts stk@(x `HappyStk` _) = let i = (case Happy_GHC_Exts.unsafeCoerce# x of { (Happy_GHC_Exts.I# (i)) -> i }) in -- trace "shifting the error token" $ happyDoAction i tk new_state (HappyCons (st) (sts)) (stk) happyShift new_state i tk st sts stk = happyNewToken new_state (HappyCons (st) (sts)) ((happyInTok (tk))`HappyStk`stk) -- happyReduce is specialised for the common cases. happySpecReduce_0 i fn 0# tk st sts stk = happyFail 0# tk st sts stk happySpecReduce_0 nt fn j tk st@((action)) sts stk = happyGoto nt j tk st (HappyCons (st) (sts)) (fn `HappyStk` stk) happySpecReduce_1 i fn 0# tk st sts stk = happyFail 0# tk st sts stk happySpecReduce_1 nt fn j tk _ sts@((HappyCons (st@(action)) (_))) (v1`HappyStk`stk') = let r = fn v1 in happySeq r (happyGoto nt j tk st sts (r `HappyStk` stk')) happySpecReduce_2 i fn 0# tk st sts stk = happyFail 0# tk st sts stk happySpecReduce_2 nt fn j tk _ (HappyCons (_) (sts@((HappyCons (st@(action)) (_))))) (v1`HappyStk`v2`HappyStk`stk') = let r = fn v1 v2 in happySeq r (happyGoto nt j tk st sts (r `HappyStk` stk')) happySpecReduce_3 i fn 0# tk st sts stk = happyFail 0# tk st sts stk happySpecReduce_3 nt fn j tk _ (HappyCons (_) ((HappyCons (_) (sts@((HappyCons (st@(action)) (_))))))) (v1`HappyStk`v2`HappyStk`v3`HappyStk`stk') = let r = fn v1 v2 v3 in happySeq r (happyGoto nt j tk st sts (r `HappyStk` stk')) happyReduce k i fn 0# tk st sts stk = happyFail 0# tk st sts stk happyReduce k nt fn j tk st sts stk = case happyDrop (k Happy_GHC_Exts.-# (1# :: Happy_GHC_Exts.Int#)) sts of sts1@((HappyCons (st1@(action)) (_))) -> let r = fn stk in -- it doesn't hurt to always seq here... happyDoSeq r (happyGoto nt j tk st1 sts1 r) happyMonadReduce k nt fn 0# tk st sts stk = happyFail 0# tk st sts stk happyMonadReduce k nt fn j tk st sts stk = case happyDrop k (HappyCons (st) (sts)) of sts1@((HappyCons (st1@(action)) (_))) -> let drop_stk = happyDropStk k stk in happyThen1 (fn stk tk) (\r -> happyGoto nt j tk st1 sts1 (r `HappyStk` drop_stk)) happyMonad2Reduce k nt fn 0# tk st sts stk = happyFail 0# tk st sts stk happyMonad2Reduce k nt fn j tk st sts stk = case happyDrop k (HappyCons (st) (sts)) of sts1@((HappyCons (st1@(action)) (_))) -> let drop_stk = happyDropStk k stk off = indexShortOffAddr happyGotoOffsets st1 off_i = (off Happy_GHC_Exts.+# nt) new_state = indexShortOffAddr happyTable off_i in happyThen1 (fn stk tk) (\r -> happyNewToken new_state sts1 (r `HappyStk` drop_stk)) happyDrop 0# l = l happyDrop n (HappyCons (_) (t)) = happyDrop (n Happy_GHC_Exts.-# (1# :: Happy_GHC_Exts.Int#)) t happyDropStk 0# l = l happyDropStk n (x `HappyStk` xs) = happyDropStk (n Happy_GHC_Exts.-# (1#::Happy_GHC_Exts.Int#)) xs ----------------------------------------------------------------------------- -- Moving to a new state after a reduction happyGoto nt j tk st = {- nothing -} happyDoAction j tk new_state where off = indexShortOffAddr happyGotoOffsets st off_i = (off Happy_GHC_Exts.+# nt) new_state = indexShortOffAddr happyTable off_i ----------------------------------------------------------------------------- -- Error recovery (0# is the error token) -- parse error if we are in recovery and we fail again happyFail 0# tk old_st _ stk@(x `HappyStk` _) = let i = (case Happy_GHC_Exts.unsafeCoerce# x of { (Happy_GHC_Exts.I# (i)) -> i }) in -- trace "failing" $ happyError_ i tk {- We don't need state discarding for our restricted implementation of "error". In fact, it can cause some bogus parses, so I've disabled it for now --SDM -- discard a state happyFail 0# tk old_st (HappyCons ((action)) (sts)) (saved_tok `HappyStk` _ `HappyStk` stk) = -- trace ("discarding state, depth " ++ show (length stk)) $ happyDoAction 0# tk action sts ((saved_tok`HappyStk`stk)) -} -- Enter error recovery: generate an error token, -- save the old token and carry on. happyFail i tk (action) sts stk = -- trace "entering error recovery" $ happyDoAction 0# tk action sts ( (Happy_GHC_Exts.unsafeCoerce# (Happy_GHC_Exts.I# (i))) `HappyStk` stk) -- Internal happy errors: notHappyAtAll :: a notHappyAtAll = error "Internal Happy error\n" ----------------------------------------------------------------------------- -- Hack to get the typechecker to accept our action functions happyTcHack :: Happy_GHC_Exts.Int# -> a -> a happyTcHack x y = y {-# INLINE happyTcHack #-} ----------------------------------------------------------------------------- -- Seq-ing. If the --strict flag is given, then Happy emits -- happySeq = happyDoSeq -- otherwise it emits -- happySeq = happyDontSeq happyDoSeq, happyDontSeq :: a -> b -> b happyDoSeq a b = a `seq` b happyDontSeq a b = b ----------------------------------------------------------------------------- -- Don't inline any functions from the template. GHC has a nasty habit -- of deciding to inline happyGoto everywhere, which increases the size of -- the generated parser quite a bit. {-# NOINLINE happyDoAction #-} {-# NOINLINE happyTable #-} {-# NOINLINE happyCheck #-} {-# NOINLINE happyActOffsets #-} {-# NOINLINE happyGotoOffsets #-} {-# NOINLINE happyDefActions #-} {-# NOINLINE happyShift #-} {-# NOINLINE happySpecReduce_0 #-} {-# NOINLINE happySpecReduce_1 #-} {-# NOINLINE happySpecReduce_2 #-} {-# NOINLINE happySpecReduce_3 #-} {-# NOINLINE happyReduce #-} {-# NOINLINE happyMonadReduce #-} {-# NOINLINE happyGoto #-} {-# NOINLINE happyFail #-} -- end of Happy Template.