blockfrost-client-0.2.0.0: blockfrost.io basic client
Safe HaskellNone
LanguageHaskell2010

Blockfrost.Client.Types

Description

Client Types

Synopsis

Documentation

runBlockfrost :: Project -> BlockfrostClient a -> IO (Either BlockfrostError a) Source #

Run BlockfrostClient monad, using provided Project

data Project #

Constructors

Project 

Fields

Instances

Instances details
Eq Project 
Instance details

Defined in Blockfrost.Auth

Methods

(==) :: Project -> Project -> Bool #

(/=) :: Project -> Project -> Bool #

Show Project 
Instance details

Defined in Blockfrost.Auth

IsString Project 
Instance details

Defined in Blockfrost.Auth

Methods

fromString :: String -> Project #

Generic Project 
Instance details

Defined in Blockfrost.Auth

Associated Types

type Rep Project :: Type -> Type #

Methods

from :: Project -> Rep Project x #

to :: Rep Project x -> Project #

type Rep Project 
Instance details

Defined in Blockfrost.Auth

type Rep Project = D1 ('MetaData "Project" "Blockfrost.Auth" "blockfrost-api-0.2.0.0-Hsre1z6A3K049l5HFlEppT" 'False) (C1 ('MetaCons "Project" 'PrefixI 'True) (S1 ('MetaSel ('Just "projectEnv") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Env) :*: S1 ('MetaSel ('Just "projectId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Paged #

Pagination parameters

Constructors

Paged 

Fields

Instances

Instances details
Eq Paged 
Instance details

Defined in Blockfrost.Util.Pagination

Methods

(==) :: Paged -> Paged -> Bool #

(/=) :: Paged -> Paged -> Bool #

Ord Paged 
Instance details

Defined in Blockfrost.Util.Pagination

Methods

compare :: Paged -> Paged -> Ordering #

(<) :: Paged -> Paged -> Bool #

(<=) :: Paged -> Paged -> Bool #

(>) :: Paged -> Paged -> Bool #

(>=) :: Paged -> Paged -> Bool #

max :: Paged -> Paged -> Paged #

min :: Paged -> Paged -> Paged #

Show Paged 
Instance details

Defined in Blockfrost.Util.Pagination

Methods

showsPrec :: Int -> Paged -> ShowS #

show :: Paged -> String #

showList :: [Paged] -> ShowS #

Default Paged 
Instance details

Defined in Blockfrost.Util.Pagination

Methods

def :: Paged #

data AsClientT (m :: Type -> Type) #

A type that specifies that an API record contains a client implementation.

Instances

Instances details
GenericMode (AsClientT m) 
Instance details

Defined in Servant.Client.Generic

Associated Types

type (AsClientT m) :- api #

type (AsClientT m) :- api 
Instance details

Defined in Servant.Client.Generic

type (AsClientT m) :- api = Client m api

fromServant :: GenericServant routes mode => ToServant routes mode -> routes mode #

Inverse of toServant.

This can be used to turn generated values such as client functions into records.

You may need to provide a type signature for the output type (your record type).

tryError :: MonadError e m => m a -> m (Either e a) Source #

MonadError analogue to the try function.

def :: Default a => a #

The default value for this type.