lsp-types-1.6.0.1: Haskell library for the Microsoft Language Server Protocol, data types
Safe HaskellNone
LanguageHaskell2010

Data.IxMap

Documentation

class Ord (Base f) => IxOrd (f :: k -> Type) where Source #

Associated Types

type Base (f :: k -> Type) Source #

Methods

toBase :: forall (a :: k). f a -> Base f Source #

Instances

Instances details
IxOrd (LspId :: Method f 'Request -> Type) Source # 
Instance details

Defined in Language.LSP.Types.LspId

Associated Types

type Base (LspId :: Method f 'Request -> Type) 
Instance details

Defined in Language.LSP.Types.LspId

Methods

toBase :: forall (a :: Method f 'Request). LspId a -> Base (LspId :: Method f 'Request -> Type) Source #

newtype IxMap (k :: a -> Type) (f :: a -> Type) Source #

Constructors

IxMap 

Fields

emptyIxMap :: forall {a} (k :: a -> Type) (f :: a -> Type). IxMap k f Source #

insertIxMap :: forall {a} k (m :: a) f. IxOrd k => k m -> f m -> IxMap k f -> Maybe (IxMap k f) Source #

lookupIxMap :: forall {a} k (m :: a) f. IxOrd k => k m -> IxMap k f -> Maybe (f m) Source #

pickFromIxMap :: forall {a} k (m :: a) f. IxOrd k => k m -> IxMap k f -> (Maybe (f m), IxMap k f) Source #