@@ -126,8 +126,6 @@ import GHC.Stack (HasCallStack)
126126import Lens.Micro (Lens' , lens , to , (^.) )
127127import NoThunks.Class (NoThunks )
128128
129- import Debug.Trace (traceM )
130-
131129class (AlonzoEraTxOut era , AlonzoEraScript era ) => BabbageEraTxOut era where
132130 referenceScriptTxOutL :: Lens' (TxOut era ) (StrictMaybe (Script era ))
133131
@@ -508,9 +506,7 @@ instance (EraScript era, Val (Value era)) => ToCBOR (BabbageTxOut era) where
508506 {-# INLINE toCBOR #-}
509507
510508instance (EraScript era , Val (Value era )) => FromCBOR (BabbageTxOut era ) where
511- fromCBOR = do
512- traceM " HERE fromCBOR BabbageTxOut"
513- fromEraCBOR @ era
509+ fromCBOR = fromEraCBOR @ era
514510 {-# INLINE fromCBOR #-}
515511
516512instance (EraScript era , Val (Value era )) => EncCBOR (BabbageTxOut era ) where
@@ -521,9 +517,7 @@ instance (EraScript era, Val (Value era)) => EncCBOR (BabbageTxOut era) where
521517 TxOutCompact addr cv -> encodeListLen 2 <> encCBOR addr <> encCBOR cv
522518
523519instance (EraScript era , Val (Value era )) => DecCBOR (BabbageTxOut era ) where
524- decCBOR = do
525- traceM " HERE decCBOR BabbageTxOut"
526- decodeBabbageTxOut fromCborBothAddr
520+ decCBOR = decodeBabbageTxOut fromCborBothAddr
527521 {-# INLINE decCBOR #-}
528522
529523instance
@@ -536,18 +530,11 @@ instance
536530 where
537531 type Share (BabbageTxOut era ) = Interns (Credential 'Staking)
538532 decShareCBOR credsInterns = do
539- traceM " HERE decShareCBOR BabbageTxOut"
540533 txOut <-
541534 peekTokenType >>= \ case
542- TypeBytes -> do
543- traceM " TypeBytes"
544- decodeMemPack
545- TypeBytesIndef -> do
546- traceM " TypeBytesIndef"
547- decodeMemPack
548- _ -> do
549- traceM " Other"
550- decCBOR
535+ TypeBytes -> decodeMemPack
536+ TypeBytesIndef -> decodeMemPack
537+ _ -> decCBOR
551538 pure $! internBabbageTxOut (interns credsInterns) txOut
552539 {-# INLINEABLE decShareCBOR #-}
553540
@@ -571,7 +558,6 @@ decodeBabbageTxOut ::
571558 (forall s' . Decoder s' (Addr , CompactAddr )) ->
572559 Decoder s (BabbageTxOut era )
573560decodeBabbageTxOut decAddr = do
574- traceM " decodeBabbageTxOut"
575561 peekTokenType >>= \ case
576562 TypeMapLenIndef -> decodeTxOut decAddr
577563 TypeMapLen -> decodeTxOut decAddr
@@ -633,9 +619,7 @@ decodeTxOut ::
633619 (forall s' . Decoder s' (Addr , CompactAddr )) ->
634620 Decoder s (BabbageTxOut era )
635621decodeTxOut decAddr = do
636- traceM $ " decodeTxOut "
637622 dtxo <- decode $ SparseKeyed " TxOut" initial bodyFields requiredFields
638- traceM $ " ok "
639623 case dtxo of
640624 DecodingTxOut SNothing _ _ _ ->
641625 cborError $ DecoderErrorCustom " BabbageTxOut" " Impossible: no Addr"
0 commit comments