module Chiasma.Ui.Data.TreeModError where

import Chiasma.Data.Ident (Ident)
import Chiasma.Ui.Data.View (LayoutView, PaneView)

data TreeModError =
  PaneExists PaneView
  |
  LayoutExists LayoutView
  |
  PaneMissing Ident
  |
  LayoutMissing Ident
  |
  AmbiguousPane Ident Int
  |
  AmbiguousLayout Ident Int
  |
  NoTrees
  deriving (TreeModError -> TreeModError -> Bool
(TreeModError -> TreeModError -> Bool)
-> (TreeModError -> TreeModError -> Bool) -> Eq TreeModError
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: TreeModError -> TreeModError -> Bool
$c/= :: TreeModError -> TreeModError -> Bool
== :: TreeModError -> TreeModError -> Bool
$c== :: TreeModError -> TreeModError -> Bool
Eq, Int -> TreeModError -> ShowS
[TreeModError] -> ShowS
TreeModError -> String
(Int -> TreeModError -> ShowS)
-> (TreeModError -> String)
-> ([TreeModError] -> ShowS)
-> Show TreeModError
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [TreeModError] -> ShowS
$cshowList :: [TreeModError] -> ShowS
show :: TreeModError -> String
$cshow :: TreeModError -> String
showsPrec :: Int -> TreeModError -> ShowS
$cshowsPrec :: Int -> TreeModError -> ShowS
Show)

deepPrisms ''TreeModError