Build #1 for barbies-th-0.1.11

[all reports]

Package barbies-th-0.1.11
Install InstallOk
Docs Ok
Tests Ok
Time submitted 2023-12-12 09:05:40.664029105 UTC
Compiler ghc-9.2.4
OS linux
Arch x86_64
Dependencies barbies-2.0.5.0, base-4.16.3.0, split-0.2.4, template-haskell-2.18.0.0
Flags none

Code Coverage

expressions0% (0/397)
booleanguards100% (0/0)
conditions 100% (0/0)
qualifiers100% (0/0)
alternatives0% (0/19)
local declarations0% (0/24)
top-level declarations0% (0/20)

Build log

[view raw]

Resolving dependencies...
Starting     split-0.2.4
Starting     base-orphans-0.9.1
Starting     tagged-0.8.8
Building     tagged-0.8.8
Building     base-orphans-0.9.1
Building     split-0.2.4
Completed    split-0.2.4
Completed    base-orphans-0.9.1
Completed    tagged-0.8.8
Starting     distributive-0.6.2.1
Building     distributive-0.6.2.1
Completed    distributive-0.6.2.1
Starting     barbies-2.0.5.0
Building     barbies-2.0.5.0
Completed    barbies-2.0.5.0
Downloading  barbies-th-0.1.11
Downloaded   barbies-th-0.1.11
Starting     barbies-th-0.1.11
Building     barbies-th-0.1.11
Completed    barbies-th-0.1.11

Test log

[view raw]

Resolving dependencies...
Build profile: -w ghc-9.2.4 -O0
In order, the following will be built (use -v for more details):
 - barbies-th-0.1.11 (first run)
Configuring barbies-th-0.1.11...
Preprocessing library for barbies-th-0.1.11..
Building library for barbies-th-0.1.11..
[1 of 3] Compiling Barbies.TH.Config ( src/Barbies/TH/Config.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/Barbies/TH/Config.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/Barbies/TH/Config.dyn_o )
[2 of 3] Compiling Barbies.TH       ( src/Barbies/TH.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/Barbies/TH.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/Barbies/TH.dyn_o )

src/Barbies/TH.hs:29:36: warning: [-Wunused-imports]
    The import of VarBangType
    from module Language.Haskell.TH.Syntax is redundant
   |
29 | import Language.Haskell.TH.Syntax (VarBangType, Name(..), mkOccName, occString)
   |                                    ^^^^^^^^^^^
[3 of 3] Compiling Data.Barbie.TH   ( src/Data/Barbie/TH.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/Data/Barbie/TH.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/Data/Barbie/TH.dyn_o )
Preprocessing test suite 'th' for barbies-th-0.1.11..
Building test suite 'th' for barbies-th-0.1.11..
[1 of 1] Compiling Main             ( tests/Main.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/th/th-tmp/Main.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/th/th-tmp/Main.dyn_o )
tests/Main.hs:(18,1)-(22,36): Splicing declarations
    declareBareB
      [d| data Foo_aWu
            = Foo_aWv {foo :: Int, bar :: String}
            deriving (Show, Eq, Generic) |]
  ======>
    data Foo sw_a31Y (h_a31Z :: ghc-prim:GHC.Types.Type
                                -> ghc-prim:GHC.Types.Type)
      = Foo_a31V {foo_a31W :: (Wear sw_a31Y h_a31Z Int),
                  bar_a31X :: (Wear sw_a31Y h_a31Z String)}
      deriving Generic
    instance BareB Foo where
      {-# INLINE bcover #-}
      {-# INLINE bstrip #-}
      bcover (Foo_a31V xfoo xbar)
        = (Foo_a31V (Data.Functor.Identity.Identity xfoo))
            (Data.Functor.Identity.Identity xbar)
      bstrip (Foo_a31V xfoo xbar)
        = (Foo_a31V (Data.Functor.Identity.runIdentity xfoo))
            (Data.Functor.Identity.runIdentity xbar)
    instance FieldNamesB (Foo Covered) where
      bfieldNames
        = (Foo_a31V
             (Data.Functor.Const.Const (Data.String.fromString "foo")))
            (Data.Functor.Const.Const (Data.String.fromString "bar"))
      bnestedFieldNames
        = (Foo_a31V
             (Data.Functor.Const.Const $ pure (Data.String.fromString "foo")))
            (Data.Functor.Const.Const $ pure (Data.String.fromString "bar"))
    instance AccessorsB (Foo Covered) where
      baccessors
        = (Foo_a31V
             ((LensB foo_a31W) (\ x_a322 b_a320 -> b_a320 {foo_a31W = x_a322})))
            ((LensB bar_a31X) (\ x_a322 b_a320 -> b_a320 {bar_a31X = x_a322}))
    instance FunctorB (Foo Covered) where
      bmap f_a323 (Foo_a31V xfoo xbar)
        = (Foo_a31V (f_a323 xfoo)) (f_a323 xbar)
    instance DistributiveB (Foo Covered) where
      bdistribute fb_a324
        = (Foo_a31V (Data.Functor.Compose.Compose (foo_a31W <$> fb_a324)))
            (Data.Functor.Compose.Compose (bar_a31X <$> fb_a324))
    instance TraversableB (Foo Covered) where
      {-# INLINE btraverse #-}
      btraverse f_a325 (Foo_a31V xfoo xbar)
        = ((Foo_a31V <$> f_a325 xfoo) <*> f_a325 xbar)
    instance ConstraintsB (Foo Covered) where
      type AllB c_a321 (Foo Covered) = (c_a321 Int, c_a321 String)
      baddDicts (Foo_a31V xfoo xbar)
        = (Foo_a31V
             ((Data.Functor.Product.Pair
                 barbies-2.0.5.0-4df3f929eb546ec4a1c45e53ab9af5c9932e2dc5071c28613d58ea3562fc1dde:Barbies.Internal.Dicts.Dict)
                xfoo))
            ((Data.Functor.Product.Pair
                barbies-2.0.5.0-4df3f929eb546ec4a1c45e53ab9af5c9932e2dc5071c28613d58ea3562fc1dde:Barbies.Internal.Dicts.Dict)
               xbar)
    instance ApplicativeB (Foo Covered) where
      bpure x_a322 = (Foo_a31V x_a322) x_a322
      bprod (Foo_a31V xfoo xbar) (Foo_a31V yfoo ybar)
        = (Foo_a31V ((Data.Functor.Product.Pair xfoo) yfoo))
            ((Data.Functor.Product.Pair xbar) ybar)
    deriving via Barbie (Foo Covered) h_a31Z instance Show (Barbie (Foo Covered) h_a31Z) =>
                                                      Show (Foo Covered h_a31Z)
    deriving via Barbie (Foo Covered) h_a31Z instance Eq (Barbie (Foo Covered) h_a31Z) =>
                                                      Eq (Foo Covered h_a31Z)
    deriving instance Show (Foo Bare Data.Functor.Identity.Identity)
    deriving instance Eq (Foo Bare Data.Functor.Identity.Identity)
tests/Main.hs:(24,1)-(32,6): Splicing declarations
    declareBareB
      [d| data Inner_a4XU
            = Inner_a4XV {inner :: Int}
            deriving (Show, Eq, Generic)
          data Outer_a4XQ
            = Outer_a4XR {outer :: Inner_a4XU, other :: Bool}
            deriving (Show, Eq, Generic) |]
  ======>
    data Inner sw_a500 (h_a501 :: ghc-prim:GHC.Types.Type
                                  -> ghc-prim:GHC.Types.Type)
      = Inner_a4ZU {inner_a4ZX :: (Wear sw_a500 h_a501 Int)}
      deriving Generic
    instance BareB Inner where
      {-# INLINE bcover #-}
      {-# INLINE bstrip #-}
      bcover (Inner_a4ZU xinner)
        = Inner_a4ZU (Data.Functor.Identity.Identity xinner)
      bstrip (Inner_a4ZU xinner)
        = Inner_a4ZU (Data.Functor.Identity.runIdentity xinner)
    instance FieldNamesB (Inner Covered) where
      bfieldNames
        = Inner_a4ZU
            (Data.Functor.Const.Const (Data.String.fromString "inner"))
      bnestedFieldNames
        = Inner_a4ZU
            (Data.Functor.Const.Const $ pure (Data.String.fromString "inner"))
    instance AccessorsB (Inner Covered) where
      baccessors
        = Inner_a4ZU
            ((LensB inner_a4ZX)
               (\ x_a504 b_a502 -> b_a502 {inner_a4ZX = x_a504}))
    instance FunctorB (Inner Covered) where
      bmap f_a505 (Inner_a4ZU xinner) = Inner_a4ZU (f_a505 xinner)
    instance DistributiveB (Inner Covered) where
      bdistribute fb_a506
        = Inner_a4ZU
            (Data.Functor.Compose.Compose (inner_a4ZX <$> fb_a506))
    instance TraversableB (Inner Covered) where
      {-# INLINE btraverse #-}
      btraverse f_a507 (Inner_a4ZU xinner)
        = (Inner_a4ZU <$> f_a507 xinner)
    instance ConstraintsB (Inner Covered) where
      type AllB c_a503 (Inner Covered) = Solo c_a503 Int
      baddDicts (Inner_a4ZU xinner)
        = Inner_a4ZU
            ((Data.Functor.Product.Pair
                barbies-2.0.5.0-4df3f929eb546ec4a1c45e53ab9af5c9932e2dc5071c28613d58ea3562fc1dde:Barbies.Internal.Dicts.Dict)
               xinner)
    instance ApplicativeB (Inner Covered) where
      bpure x_a504 = Inner_a4ZU x_a504
      bprod (Inner_a4ZU xinner) (Inner_a4ZU yinner)
        = Inner_a4ZU ((Data.Functor.Product.Pair xinner) yinner)
    deriving via Barbie (Inner Covered) h_a501 instance Show (Barbie (Inner Covered) h_a501) =>
                                                        Show (Inner Covered h_a501)
    deriving via Barbie (Inner Covered) h_a501 instance Eq (Barbie (Inner Covered) h_a501) =>
                                                        Eq (Inner Covered h_a501)
    deriving instance Show (Inner Bare Data.Functor.Identity.Identity)
    deriving instance Eq (Inner Bare Data.Functor.Identity.Identity)
    data Outer sw_a508 (h_a509 :: ghc-prim:GHC.Types.Type
                                  -> ghc-prim:GHC.Types.Type)
      = Outer_a4ZW {outer_a4ZY :: (Inner sw_a508 h_a509),
                    other_a4ZZ :: (Wear sw_a508 h_a509 Bool)}
      deriving Generic
    instance BareB Outer where
      {-# INLINE bcover #-}
      {-# INLINE bstrip #-}
      bcover (Outer_a4ZW xouter xother)
        = (Outer_a4ZW (bcover xouter))
            (Data.Functor.Identity.Identity xother)
      bstrip (Outer_a4ZW xouter xother)
        = (Outer_a4ZW (bstrip xouter))
            (Data.Functor.Identity.runIdentity xother)
    instance FieldNamesB (Outer Covered) where
      bfieldNames
        = (Outer_a4ZW bfieldNames)
            (Data.Functor.Const.Const (Data.String.fromString "other"))
      bnestedFieldNames
        = (Outer_a4ZW
             (Data.Bifunctor.first
                (Data.List.NonEmpty.cons (Data.String.fromString "outer"))
                `bmap` bnestedFieldNames))
            (Data.Functor.Const.Const $ pure (Data.String.fromString "other"))
    instance AccessorsB (Outer Covered) where
      baccessors
        = (Outer_a4ZW
             ((bmap
                 (Barbies.TH.nestLensB
                    (\ b_a50a
                       -> (\ x_a50c -> b_a50a {outer_a4ZY = x_a50c}, outer_a4ZY b_a50a))))
                baccessors))
            ((LensB other_a4ZZ)
               (\ x_a50c b_a50a -> b_a50a {other_a4ZZ = x_a50c}))
    instance FunctorB (Outer Covered) where
      bmap f_a50d (Outer_a4ZW xouter xother)
        = (Outer_a4ZW ((bmap f_a50d) xouter)) (f_a50d xother)
    instance DistributiveB (Outer Covered) where
      bdistribute fb_a50e
        = (Outer_a4ZW (bdistribute (outer_a4ZY <$> fb_a50e)))
            (Data.Functor.Compose.Compose (other_a4ZZ <$> fb_a50e))
    instance TraversableB (Outer Covered) where
      {-# INLINE btraverse #-}
      btraverse f_a50f (Outer_a4ZW xouter xother)
        = ((Outer_a4ZW <$> (btraverse f_a50f) xouter) <*> f_a50f xother)
    instance ConstraintsB (Outer Covered) where
      type AllB c_a50b (Outer Covered) = (AllB c_a50b (Inner Covered),
                                          c_a50b Bool)
      baddDicts (Outer_a4ZW xouter xother)
        = (Outer_a4ZW (baddDicts xouter))
            ((Data.Functor.Product.Pair
                barbies-2.0.5.0-4df3f929eb546ec4a1c45e53ab9af5c9932e2dc5071c28613d58ea3562fc1dde:Barbies.Internal.Dicts.Dict)
               xother)
    instance ApplicativeB (Outer Covered) where
      bpure x_a50c = (Outer_a4ZW (bpure x_a50c)) x_a50c
      bprod (Outer_a4ZW xouter xother) (Outer_a4ZW youter yother)
        = (Outer_a4ZW ((bprod xouter) youter))
            ((Data.Functor.Product.Pair xother) yother)
    deriving via Barbie (Outer Covered) h_a509 instance Show (Barbie (Outer Covered) h_a509) =>
                                                        Show (Outer Covered h_a509)
    deriving via Barbie (Outer Covered) h_a509 instance Eq (Barbie (Outer Covered) h_a509) =>
                                                        Eq (Outer Covered h_a509)
    deriving instance Show (Outer Bare Data.Functor.Identity.Identity)
    deriving instance Eq (Outer Bare Data.Functor.Identity.Identity)
tests/Main.hs:(34,1)-(38,6): Splicing declarations
    declareBareBWithOtherBarbies
      [''Foo] [d| data Baz_a5vz = Baz_a5vA {baz :: Foo} |]
  ======>
    data Baz sw_a5wl (h_a5wm :: ghc-prim:GHC.Types.Type
                                -> ghc-prim:GHC.Types.Type)
      = Baz_a5wj {baz_a5wk :: (Foo sw_a5wl h_a5wm)}
      deriving ()
    instance BareB Baz where
      {-# INLINE bcover #-}
      {-# INLINE bstrip #-}
      bcover (Baz_a5wj xbaz) = Baz_a5wj (bcover xbaz)
      bstrip (Baz_a5wj xbaz) = Baz_a5wj (bstrip xbaz)
    instance FieldNamesB (Baz Covered) where
      bfieldNames = Baz_a5wj bfieldNames
      bnestedFieldNames
        = Baz_a5wj
            (Data.Bifunctor.first
               (Data.List.NonEmpty.cons (Data.String.fromString "baz"))
               `bmap` bnestedFieldNames)
    instance AccessorsB (Baz Covered) where
      baccessors
        = Baz_a5wj
            ((bmap
                (Barbies.TH.nestLensB
                   (\ b_a5wn
                      -> (\ x_a5wp -> b_a5wn {baz_a5wk = x_a5wp}, baz_a5wk b_a5wn))))
               baccessors)
    instance FunctorB (Baz Covered) where
      bmap f_a5wq (Baz_a5wj xbaz) = Baz_a5wj ((bmap f_a5wq) xbaz)
    instance DistributiveB (Baz Covered) where
      bdistribute fb_a5wr = Baz_a5wj (bdistribute (baz_a5wk <$> fb_a5wr))
    instance TraversableB (Baz Covered) where
      {-# INLINE btraverse #-}
      btraverse f_a5ws (Baz_a5wj xbaz)
        = (Baz_a5wj <$> (btraverse f_a5ws) xbaz)
    instance ConstraintsB (Baz Covered) where
      type AllB c_a5wo (Baz Covered) = Solo AllB c_a5wo (Foo Covered)
      baddDicts (Baz_a5wj xbaz) = Baz_a5wj (baddDicts xbaz)
    instance ApplicativeB (Baz Covered) where
      bpure x_a5wp = Baz_a5wj (bpure x_a5wp)
      bprod (Baz_a5wj xbaz) (Baz_a5wj ybaz)
        = Baz_a5wj ((bprod xbaz) ybaz)
tests/Main.hs:(40,1)-(42,6): Splicing declarations
    declareBareB [d| data EmptyRecord_a5BS = EmptyRecord_a5BT {} |]
  ======>
    data EmptyRecord sw_a5Ch (h_a5Ci :: ghc-prim:GHC.Types.Type
                                        -> ghc-prim:GHC.Types.Type)
      = EmptyRecord_a5Cg {}
      deriving ()
    instance BareB EmptyRecord where
      {-# INLINE bcover #-}
      {-# INLINE bstrip #-}
      bcover EmptyRecord_a5Cg = EmptyRecord_a5Cg
      bstrip EmptyRecord_a5Cg = EmptyRecord_a5Cg
    instance FieldNamesB (EmptyRecord Covered) where
      bfieldNames = EmptyRecord_a5Cg
      bnestedFieldNames = EmptyRecord_a5Cg
    instance AccessorsB (EmptyRecord Covered) where
      baccessors = EmptyRecord_a5Cg
    instance FunctorB (EmptyRecord Covered) where
      bmap f_a5Cm EmptyRecord_a5Cg = EmptyRecord_a5Cg
    instance DistributiveB (EmptyRecord Covered) where
      bdistribute fb_a5Cn = EmptyRecord_a5Cg
    instance TraversableB (EmptyRecord Covered) where
      {-# INLINE btraverse #-}
      btraverse f_a5Co EmptyRecord_a5Cg = pure EmptyRecord_a5Cg
    instance ConstraintsB (EmptyRecord Covered) where
      type AllB c_a5Ck (EmptyRecord Covered) = ()
      baddDicts EmptyRecord_a5Cg = EmptyRecord_a5Cg
    instance ApplicativeB (EmptyRecord Covered) where
      bpure x_a5Cl = EmptyRecord_a5Cg
      bprod EmptyRecord_a5Cg EmptyRecord_a5Cg = EmptyRecord_a5Cg
Linking /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/th/th ...
Preprocessing test suite 'th-passthrough' for barbies-th-0.1.11..
Building test suite 'th-passthrough' for barbies-th-0.1.11..
[1 of 1] Compiling Main             ( tests/passthrough.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/th-passthrough/th-passthrough-tmp/Main.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/th-passthrough/th-passthrough-tmp/Main.dyn_o )
tests/passthrough.hs:(17,1)-(21,36): Splicing declarations
    passthroughBareB
      [d| data Foo_aYP
            = Foo_aYQ {foo :: Int, bar :: String}
            deriving (Show, Eq, Generic) |]
  ======>
    data FooB sw_a34i (h_a34j :: ghc-prim:GHC.Types.Type
                                 -> ghc-prim:GHC.Types.Type)
      = Foo_a34f {foo_a34g :: (Wear sw_a34i h_a34j Int),
                  bar_a34h :: (Wear sw_a34i h_a34j String)}
      deriving Generic
    instance BareB FooB where
      {-# INLINE bcover #-}
      {-# INLINE bstrip #-}
      bcover (Foo_a34f xfoo xbar)
        = (Foo_a34f (Identity xfoo)) (Identity xbar)
      bstrip (Foo_a34f xfoo xbar)
        = (Foo_a34f (runIdentity xfoo)) (runIdentity xbar)
    instance FieldNamesB (FooB Covered) where
      bfieldNames
        = (Foo_a34f
             (Data.Functor.Const.Const (Data.String.fromString "foo")))
            (Data.Functor.Const.Const (Data.String.fromString "bar"))
      bnestedFieldNames
        = (Foo_a34f
             (Data.Functor.Const.Const $ pure (Data.String.fromString "foo")))
            (Data.Functor.Const.Const $ pure (Data.String.fromString "bar"))
    instance AccessorsB (FooB Covered) where
      baccessors
        = (Foo_a34f
             ((LensB foo_a34g) (\ x_a34m b_a34k -> b_a34k {foo_a34g = x_a34m})))
            ((LensB bar_a34h) (\ x_a34m b_a34k -> b_a34k {bar_a34h = x_a34m}))
    instance FunctorB (FooB Covered) where
      bmap f_a34n (Foo_a34f xfoo xbar)
        = (Foo_a34f (f_a34n xfoo)) (f_a34n xbar)
    instance DistributiveB (FooB Covered) where
      bdistribute fb_a34o
        = (Foo_a34f (Data.Functor.Compose.Compose (foo_a34g <$> fb_a34o)))
            (Data.Functor.Compose.Compose (bar_a34h <$> fb_a34o))
    instance TraversableB (FooB Covered) where
      {-# INLINE btraverse #-}
      btraverse f_a34p (Foo_a34f xfoo xbar)
        = ((Foo_a34f <$> f_a34p xfoo) <*> f_a34p xbar)
    instance ConstraintsB (FooB Covered) where
      type AllB c_a34l (FooB Covered) = (c_a34l Int, c_a34l String)
      baddDicts (Foo_a34f xfoo xbar)
        = (Foo_a34f
             ((Data.Functor.Product.Pair
                 barbies-2.0.5.0-4df3f929eb546ec4a1c45e53ab9af5c9932e2dc5071c28613d58ea3562fc1dde:Barbies.Internal.Dicts.Dict)
                xfoo))
            ((Data.Functor.Product.Pair
                barbies-2.0.5.0-4df3f929eb546ec4a1c45e53ab9af5c9932e2dc5071c28613d58ea3562fc1dde:Barbies.Internal.Dicts.Dict)
               xbar)
    instance ApplicativeB (FooB Covered) where
      bpure x_a34m = (Foo_a34f x_a34m) x_a34m
      bprod (Foo_a34f xfoo xbar) (Foo_a34f yfoo ybar)
        = (Foo_a34f ((Data.Functor.Product.Pair xfoo) yfoo))
            ((Data.Functor.Product.Pair xbar) ybar)
    deriving via Barbie (FooB Covered) h_a34j instance Show (Barbie (FooB Covered) h_a34j) =>
                                                       Show (FooB Covered h_a34j)
    deriving via Barbie (FooB Covered) h_a34j instance Eq (Barbie (FooB Covered) h_a34j) =>
                                                       Eq (FooB Covered h_a34j)
    deriving instance Show (FooB Bare Identity)
    deriving instance Eq (FooB Bare Identity)
    type Foo = FooB Bare Identity
    type FooH = FooB Covered
tests/passthrough.hs:(23,1)-(31,6): Splicing declarations
    passthroughBareB
      [d| data Inner_a4Y2
            = Inner_a4Y3 {inner :: Int}
            deriving (Show, Eq, Generic)
          data Outer_a4XY
            = Outer_a4XZ {outer :: Inner_a4Y2, other :: Bool}
            deriving (Show, Eq, Generic) |]
  ======>
    data InnerB sw_a508 (h_a509 :: ghc-prim:GHC.Types.Type
                                   -> ghc-prim:GHC.Types.Type)
      = Inner_a502 {inner_a505 :: (Wear sw_a508 h_a509 Int)}
      deriving Generic
    instance BareB InnerB where
      {-# INLINE bcover #-}
      {-# INLINE bstrip #-}
      bcover (Inner_a502 xinner) = Inner_a502 (Identity xinner)
      bstrip (Inner_a502 xinner) = Inner_a502 (runIdentity xinner)
    instance FieldNamesB (InnerB Covered) where
      bfieldNames
        = Inner_a502
            (Data.Functor.Const.Const (Data.String.fromString "inner"))
      bnestedFieldNames
        = Inner_a502
            (Data.Functor.Const.Const $ pure (Data.String.fromString "inner"))
    instance AccessorsB (InnerB Covered) where
      baccessors
        = Inner_a502
            ((LensB inner_a505)
               (\ x_a50c b_a50a -> b_a50a {inner_a505 = x_a50c}))
    instance FunctorB (InnerB Covered) where
      bmap f_a50d (Inner_a502 xinner) = Inner_a502 (f_a50d xinner)
    instance DistributiveB (InnerB Covered) where
      bdistribute fb_a50e
        = Inner_a502
            (Data.Functor.Compose.Compose (inner_a505 <$> fb_a50e))
    instance TraversableB (InnerB Covered) where
      {-# INLINE btraverse #-}
      btraverse f_a50f (Inner_a502 xinner)
        = (Inner_a502 <$> f_a50f xinner)
    instance ConstraintsB (InnerB Covered) where
      type AllB c_a50b (InnerB Covered) = Solo c_a50b Int
      baddDicts (Inner_a502 xinner)
        = Inner_a502
            ((Data.Functor.Product.Pair
                barbies-2.0.5.0-4df3f929eb546ec4a1c45e53ab9af5c9932e2dc5071c28613d58ea3562fc1dde:Barbies.Internal.Dicts.Dict)
               xinner)
    instance ApplicativeB (InnerB Covered) where
      bpure x_a50c = Inner_a502 x_a50c
      bprod (Inner_a502 xinner) (Inner_a502 yinner)
        = Inner_a502 ((Data.Functor.Product.Pair xinner) yinner)
    deriving via Barbie (InnerB Covered) h_a509 instance Show (Barbie (InnerB Covered) h_a509) =>
                                                         Show (InnerB Covered h_a509)
    deriving via Barbie (InnerB Covered) h_a509 instance Eq (Barbie (InnerB Covered) h_a509) =>
                                                         Eq (InnerB Covered h_a509)
    deriving instance Show (InnerB Bare Identity)
    deriving instance Eq (InnerB Bare Identity)
    type Inner = InnerB Bare Identity
    type InnerH = InnerB Covered
    data OuterB sw_a50g (h_a50h :: ghc-prim:GHC.Types.Type
                                   -> ghc-prim:GHC.Types.Type)
      = Outer_a504 {outer_a506 :: (InnerB sw_a50g h_a50h),
                    other_a507 :: (Wear sw_a50g h_a50h Bool)}
      deriving Generic
    instance BareB OuterB where
      {-# INLINE bcover #-}
      {-# INLINE bstrip #-}
      bcover (Outer_a504 xouter xother)
        = (Outer_a504 (bcover xouter)) (Identity xother)
      bstrip (Outer_a504 xouter xother)
        = (Outer_a504 (bstrip xouter)) (runIdentity xother)
    instance FieldNamesB (OuterB Covered) where
      bfieldNames
        = (Outer_a504 bfieldNames)
            (Data.Functor.Const.Const (Data.String.fromString "other"))
      bnestedFieldNames
        = (Outer_a504
             (Data.Bifunctor.first
                (Data.List.NonEmpty.cons (Data.String.fromString "outer"))
                `bmap` bnestedFieldNames))
            (Data.Functor.Const.Const $ pure (Data.String.fromString "other"))
    instance AccessorsB (OuterB Covered) where
      baccessors
        = (Outer_a504
             ((bmap
                 (Barbies.TH.nestLensB
                    (\ b_a50i
                       -> (\ x_a50k -> b_a50i {outer_a506 = x_a50k}, outer_a506 b_a50i))))
                baccessors))
            ((LensB other_a507)
               (\ x_a50k b_a50i -> b_a50i {other_a507 = x_a50k}))
    instance FunctorB (OuterB Covered) where
      bmap f_a50l (Outer_a504 xouter xother)
        = (Outer_a504 ((bmap f_a50l) xouter)) (f_a50l xother)
    instance DistributiveB (OuterB Covered) where
      bdistribute fb_a50m
        = (Outer_a504 (bdistribute (outer_a506 <$> fb_a50m)))
            (Data.Functor.Compose.Compose (other_a507 <$> fb_a50m))
    instance TraversableB (OuterB Covered) where
      {-# INLINE btraverse #-}
      btraverse f_a50n (Outer_a504 xouter xother)
        = ((Outer_a504 <$> (btraverse f_a50n) xouter) <*> f_a50n xother)
    instance ConstraintsB (OuterB Covered) where
      type AllB c_a50j (OuterB Covered) = (AllB c_a50j (InnerB Covered),
                                           c_a50j Bool)
      baddDicts (Outer_a504 xouter xother)
        = (Outer_a504 (baddDicts xouter))
            ((Data.Functor.Product.Pair
                barbies-2.0.5.0-4df3f929eb546ec4a1c45e53ab9af5c9932e2dc5071c28613d58ea3562fc1dde:Barbies.Internal.Dicts.Dict)
               xother)
    instance ApplicativeB (OuterB Covered) where
      bpure x_a50k = (Outer_a504 (bpure x_a50k)) x_a50k
      bprod (Outer_a504 xouter xother) (Outer_a504 youter yother)
        = (Outer_a504 ((bprod xouter) youter))
            ((Data.Functor.Product.Pair xother) yother)
    deriving via Barbie (OuterB Covered) h_a50h instance Show (Barbie (OuterB Covered) h_a50h) =>
                                                         Show (OuterB Covered h_a50h)
    deriving via Barbie (OuterB Covered) h_a50h instance Eq (Barbie (OuterB Covered) h_a50h) =>
                                                         Eq (OuterB Covered h_a50h)
    deriving instance Show (OuterB Bare Identity)
    deriving instance Eq (OuterB Bare Identity)
    type Outer = OuterB Bare Identity
    type OuterH = OuterB Covered
Linking /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/build/th-passthrough/th-passthrough ...
Running 2 test suites...
Test suite th: RUNNING...
Test suite th: PASS
Test suite logged to:
/home/builder/builder-dir/build-cache/tmp-install/reports/barbies-th-0.1.11.test
Writing: barbies-th-0.1.11-inplace/Barbies.TH.Config.hs.html
Writing: barbies-th-0.1.11-inplace/Barbies.TH.hs.html
Writing: hpc_index.html
Writing: hpc_index_fun.html
Writing: hpc_index_alt.html
Writing: hpc_index_exp.html
Test coverage report written to
/home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/hpc/vanilla/html/th/hpc_index.html
Test suite th-passthrough: RUNNING...
Test suite th-passthrough: PASS
Test suite logged to:
/home/builder/builder-dir/build-cache/tmp-install/reports/barbies-th-0.1.11.test
Writing: barbies-th-0.1.11-inplace/Barbies.TH.Config.hs.html
Writing: barbies-th-0.1.11-inplace/Barbies.TH.hs.html
Writing: hpc_index.html
Writing: hpc_index_fun.html
Writing: hpc_index_alt.html
Writing: hpc_index_exp.html
Test coverage report written to
/home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/hpc/vanilla/html/th-passthrough/hpc_index.html
2 of 2 test suites (2 of 2 test cases) passed.
Writing: barbies-th-0.1.11-inplace/Barbies.TH.hs.html
Writing: barbies-th-0.1.11-inplace/Barbies.TH.Config.hs.html
Writing: hpc_index.html
Writing: hpc_index_fun.html
Writing: hpc_index_alt.html
Writing: hpc_index_exp.html
Package coverage report written to
/home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/barbies-th-0.1.11/noopt/hpc/vanilla/html/barbies-th-0.1.11/hpc_index.html