fix(grfn/xanthous): Fix build
Bunch of miscellaneous stuff due to breakages in dependencies Change-Id: I807cfa875148e7e5b691f2be0b58dc0a08f3c3ad Reviewed-on: https://cl.tvl.fyi/c/depot/+/9003 Autosubmit: grfn <grfn@gws.fyi> Reviewed-by: grfn <grfn@gws.fyi> Tested-by: BuildkiteCI
This commit is contained in:
parent
e40908d4aa
commit
dbc17e8c4b
3 changed files with 12 additions and 6 deletions
|
@ -55,7 +55,7 @@ handlePromptEvent _ (Prompt _ SConfirm _ _ _) (VtyEvent (EvKey (KChar 'n') []))
|
|||
handlePromptEvent
|
||||
msg
|
||||
(Prompt c SStringPrompt (StringPromptState edit) pri cb)
|
||||
ev
|
||||
(VtyEvent ev)
|
||||
= do
|
||||
edit' <- lift $ handleEditorEvent ev edit
|
||||
let prompt' = Prompt c SStringPrompt (StringPromptState edit') pri cb
|
||||
|
|
|
@ -191,7 +191,7 @@ y = lens (\(Position _ yy) -> yy) (\(Position xx _) yy -> Position xx yy)
|
|||
|
||||
type Position = Position' Int
|
||||
|
||||
instance (Arg (Position' a) a, Arbitrary a) => Arbitrary (Position' a) where
|
||||
instance (Arbitrary a) => Arbitrary (Position' a) where
|
||||
arbitrary = genericArbitrary
|
||||
shrink (Position px py) = Position <$> shrink px <*> shrink py
|
||||
|
||||
|
@ -434,7 +434,7 @@ data Neighbors a = Neighbors
|
|||
deriving stock (Show, Eq, Ord, Functor, Foldable, Traversable, Generic)
|
||||
deriving anyclass (NFData, CoArbitrary, Function, MonoFoldable)
|
||||
|
||||
deriving via (GenericArbitrary (Neighbors a)) instance (Arg (Neighbors a) a, Arbitrary a) => Arbitrary (Neighbors a)
|
||||
deriving via (GenericArbitrary (Neighbors a)) instance (Arbitrary a) => Arbitrary (Neighbors a)
|
||||
|
||||
type instance Element (Neighbors a) = a
|
||||
|
||||
|
@ -774,7 +774,7 @@ makeFieldsNoPrefix ''Box
|
|||
|
||||
-- It seems to be necessary to have an `Arg (V2 a) a` constraint, as a is passed
|
||||
-- to V2 internally, in order to make GHC figure out this deriving via correctly.
|
||||
deriving via (GenericArbitrary (Box a)) instance (Arg (V2 a) a, Arbitrary a) => Arbitrary (Box a)
|
||||
deriving via (GenericArbitrary (Box a)) instance (Arbitrary a) => Arbitrary (Box a)
|
||||
|
||||
bottomRightCorner :: Num a => Box a -> V2 a
|
||||
bottomRightCorner box =
|
||||
|
|
|
@ -15,6 +15,7 @@ import Data.Aeson hiding (Key)
|
|||
import qualified Data.Aeson.KeyMap as KM
|
||||
import Data.Aeson.Types (typeMismatch)
|
||||
import Data.List.NonEmpty (NonEmpty(..))
|
||||
import qualified Graphics.Vty.Input
|
||||
import Graphics.Vty.Attributes
|
||||
import Brick.Widgets.Edit
|
||||
import Data.Text.Zipper.Generic (GenericTextZipper)
|
||||
|
@ -22,7 +23,7 @@ import Brick.Widgets.Core (getName)
|
|||
import System.Random.Internal (StdGen (..))
|
||||
import System.Random.SplitMix (SMGen ())
|
||||
import Test.QuickCheck
|
||||
import Test.QuickCheck.Arbitrary.Generic (Arg ())
|
||||
-- import Test.QuickCheck.Arbitrary.Generic (Arg ())
|
||||
import "quickcheck-instances" Test.QuickCheck.Instances ()
|
||||
import Text.Megaparsec (errorBundlePretty)
|
||||
import Text.Megaparsec.Pos
|
||||
|
@ -373,7 +374,7 @@ deriving newtype instance (Arbitrary s, CoArbitrary (m (a, s)))
|
|||
|
||||
--------------------------------------------------------------------------------
|
||||
|
||||
deriving via (GenericArbitrary (V2 a)) instance (Arg (V2 a) a, Arbitrary a) => Arbitrary (V2 a)
|
||||
deriving via (GenericArbitrary (V2 a)) instance (Arbitrary a) => Arbitrary (V2 a)
|
||||
instance CoArbitrary a => CoArbitrary (V2 a)
|
||||
instance Function a => Function (V2 a)
|
||||
|
||||
|
@ -487,3 +488,8 @@ instance forall a. (FromJSON a, Ord a) => FromJSON (Interval a) where
|
|||
pure $ val <=..<= val
|
||||
checkLength arr =
|
||||
when (length arr /= 2) $ fail "Expected array of length 2"
|
||||
|
||||
--------------------------------------------------------------------------------
|
||||
|
||||
deriving anyclass instance NFData Graphics.Vty.Input.Key
|
||||
deriving anyclass instance NFData Graphics.Vty.Input.Modifier
|
||||
|
|
Loading…
Reference in a new issue