cobot-io-0.1.2.0: Biological data file formats and IO

Safe HaskellNone
LanguageHaskell2010

Bio.Structure

Synopsis

Documentation

data SecondaryStructure Source #

Protein secondary structure

Constructors

PiHelix

pi helix

Bend

bend

AlphaHelix

alpha helix

Extended

extended

ThreeTenHelix

3-10 helix

Bridge

brigde

Turn

turn

Coil

coil

Undefined

unknown structure

Instances
Eq SecondaryStructure Source # 
Instance details

Defined in Bio.Structure

Show SecondaryStructure Source # 
Instance details

Defined in Bio.Structure

Generic SecondaryStructure Source # 
Instance details

Defined in Bio.Structure

Associated Types

type Rep SecondaryStructure :: Type -> Type #

NFData SecondaryStructure Source # 
Instance details

Defined in Bio.Structure

Methods

rnf :: SecondaryStructure -> () #

type Rep SecondaryStructure Source # 
Instance details

Defined in Bio.Structure

type Rep SecondaryStructure = D1 (MetaData "SecondaryStructure" "Bio.Structure" "cobot-io-0.1.2.0-Edw5pXm2rhDLW8sGnHkG2U" False) (((C1 (MetaCons "PiHelix" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Bend" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "AlphaHelix" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Extended" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "ThreeTenHelix" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Bridge" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Turn" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Coil" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Undefined" PrefixI False) (U1 :: Type -> Type)))))

data Atom Source #

Generic atom representation

Constructors

Atom 

Fields

Instances
Eq Atom Source # 
Instance details

Defined in Bio.Structure

Methods

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

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

Show Atom Source # 
Instance details

Defined in Bio.Structure

Methods

showsPrec :: Int -> Atom -> ShowS #

show :: Atom -> String #

showList :: [Atom] -> ShowS #

Generic Atom Source # 
Instance details

Defined in Bio.Structure

Associated Types

type Rep Atom :: Type -> Type #

Methods

from :: Atom -> Rep Atom x #

to :: Rep Atom x -> Atom #

NFData Atom Source # 
Instance details

Defined in Bio.Structure

Methods

rnf :: Atom -> () #

type Rep Atom Source # 
Instance details

Defined in Bio.Structure

data Bond Source #

Generic chemical bond

Constructors

Bond 

Fields

Instances
Eq Bond Source # 
Instance details

Defined in Bio.Structure

Methods

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

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

Show Bond Source # 
Instance details

Defined in Bio.Structure

Methods

showsPrec :: Int -> Bond -> ShowS #

show :: Bond -> String #

showList :: [Bond] -> ShowS #

Generic Bond Source # 
Instance details

Defined in Bio.Structure

Associated Types

type Rep Bond :: Type -> Type #

Methods

from :: Bond -> Rep Bond x #

to :: Rep Bond x -> Bond #

NFData Bond Source # 
Instance details

Defined in Bio.Structure

Methods

rnf :: Bond -> () #

type Rep Bond Source # 
Instance details

Defined in Bio.Structure

type Rep Bond = D1 (MetaData "Bond" "Bio.Structure" "cobot-io-0.1.2.0-Edw5pXm2rhDLW8sGnHkG2U" False) (C1 (MetaCons "Bond" PrefixI True) (S1 (MetaSel (Just "bondStart") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: (S1 (MetaSel (Just "bondEnd") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: S1 (MetaSel (Just "bondOrder") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int))))

data Residue Source #

A set of atoms, organized to a residues

Constructors

Residue 

Fields

Instances
Eq Residue Source # 
Instance details

Defined in Bio.Structure

Methods

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

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

Show Residue Source # 
Instance details

Defined in Bio.Structure

Generic Residue Source # 
Instance details

Defined in Bio.Structure

Associated Types

type Rep Residue :: Type -> Type #

Methods

from :: Residue -> Rep Residue x #

to :: Rep Residue x -> Residue #

NFData Residue Source # 
Instance details

Defined in Bio.Structure

Methods

rnf :: Residue -> () #

type Rep Residue Source # 
Instance details

Defined in Bio.Structure

data Chain Source #

Chain organizes linear structure of residues

Constructors

Chain 

Fields

Instances
Eq Chain Source # 
Instance details

Defined in Bio.Structure

Methods

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

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

Show Chain Source # 
Instance details

Defined in Bio.Structure

Methods

showsPrec :: Int -> Chain -> ShowS #

show :: Chain -> String #

showList :: [Chain] -> ShowS #

Generic Chain Source # 
Instance details

Defined in Bio.Structure

Associated Types

type Rep Chain :: Type -> Type #

Methods

from :: Chain -> Rep Chain x #

to :: Rep Chain x -> Chain #

NFData Chain Source # 
Instance details

Defined in Bio.Structure

Methods

rnf :: Chain -> () #

type Rep Chain Source # 
Instance details

Defined in Bio.Structure

type Rep Chain = D1 (MetaData "Chain" "Bio.Structure" "cobot-io-0.1.2.0-Edw5pXm2rhDLW8sGnHkG2U" False) (C1 (MetaCons "Chain" PrefixI True) (S1 (MetaSel (Just "chainName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text) :*: S1 (MetaSel (Just "chainResidues") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Array Int Residue))))

newtype Model Source #

Model represents a single experiment of structure determination

Constructors

Model 
Instances
Eq Model Source # 
Instance details

Defined in Bio.Structure

Methods

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

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

Show Model Source # 
Instance details

Defined in Bio.Structure

Methods

showsPrec :: Int -> Model -> ShowS #

show :: Model -> String #

showList :: [Model] -> ShowS #

Generic Model Source # 
Instance details

Defined in Bio.Structure

Associated Types

type Rep Model :: Type -> Type #

Methods

from :: Model -> Rep Model x #

to :: Rep Model x -> Model #

NFData Model Source # 
Instance details

Defined in Bio.Structure

Methods

rnf :: Model -> () #

type Rep Model Source # 
Instance details

Defined in Bio.Structure

type Rep Model = D1 (MetaData "Model" "Bio.Structure" "cobot-io-0.1.2.0-Edw5pXm2rhDLW8sGnHkG2U" True) (C1 (MetaCons "Model" PrefixI True) (S1 (MetaSel (Just "modelChains") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Array Int Chain))))

class StructureModels a where Source #

Convert any format-specific data to an intermediate representation of structure

Methods

modelsOf :: a -> Array Int Model Source #

Get an array of models

Instances
StructureModels MMTF Source # 
Instance details

Defined in Bio.MMTF

class StructureSerializable a where Source #

Serialize an intermediate representation of sequence to some specific format

Methods

serializeModels :: Array Int Model -> a Source #

Serialize an array of models to some format