{-# OPTIONS_GHC -Wno-orphans #-}
module System.Process.Quick.OrphanArbitrary where

import System.Process.Quick.Prelude

instance Arbitrary a => Arbitrary (NonEmpty a) where
  arbitrary :: Gen (NonEmpty a)
arbitrary = (a -> [a] -> NonEmpty a) -> Gen a -> Gen [a] -> Gen (NonEmpty a)
forall a b c. (a -> b -> c) -> Gen a -> Gen b -> Gen c
forall (f :: * -> *) a b c.
Applicative f =>
(a -> b -> c) -> f a -> f b -> f c
liftA2 a -> [a] -> NonEmpty a
forall a. a -> [a] -> NonEmpty a
(:|) (Gen a
forall a. Arbitrary a => Gen a
arbitrary :: Gen a) (Gen a -> Gen [a]
forall a. Gen a -> Gen [a]
listOf (Gen a
forall a. Arbitrary a => Gen a
arbitrary :: Gen a))