module Fixme where foo :: [a] -> () {-@ foo :: [{v:a | v = 5}] -> () @-} foo _ = () bar :: a -> b -> a {-@ bar :: forall

b -> Prop>. x:a -> {xx:b

| xx > xx} -> a @-} bar x y = x