| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Bio.Protein.AminoAcid.Instances
Contents
Synopsis
- class Createable a where
- class Functor r => HasRadical r where
- type RadicalType r a :: Type
- radical :: (Functor f, Functor g) => Lens' (AminoAcid f (Env r) g a) (RadicalType r a)
- class Functor r => HasRadicalType r where
- class Functor r => HasCA r where
- class Functor r => HasC r where
- class Functor r => HasO r where
- class Functor r => HasOXT r where
- class Functor r => HasN r where
- class Functor f => HasAtom f where
- hydrogens :: Lens' (Env [] a) [a]
Documentation
class Createable a where Source #
Single object can be created
Instances
| Createable (BBOXTRH a) Source # | |
| Createable (BBORH a) Source # | |
| Createable (BBOXTR a) Source # | |
| Createable (BBOR a) Source # | |
| Createable (BBOCG a) Source # | |
| Createable (BBOT a) Source # | |
| Createable (BBO a) Source # | |
| Createable (BBCG a) Source # | |
| Createable (BBCAT a) Source # | |
| Createable (BBT a) Source # | |
| Createable (BBCA a) Source # | |
| Createable (BB a) Source # | |
class Functor r => HasRadical r where Source #
Has lens to observe, set and modify radicals
Associated Types
type RadicalType r a :: Type Source #
Methods
radical :: (Functor f, Functor g) => Lens' (AminoAcid f (Env r) g a) (RadicalType r a) Source #
Lens for radical atom or group
Instances
| HasRadical Identity Source # | |
| HasRadical CG Source # | |
| HasRadical Radical Source # | |
| HasRadical (Const x :: Type -> Type) Source # | |
class Functor r => HasRadicalType r where Source #
Has lens to observe radical types
Methods
radicalType :: (Functor f, Functor g) => Getting AA (AminoAcid f (Env r) g a) AA Source #
Getter for radical type
Instances
| HasRadicalType CG Source # | |
| HasRadicalType Radical Source # | |
| HasRadicalType (Const AA :: Type -> Type) Source # | |
class Functor r => HasCA r where Source #
Has lens to observe, set and modify ca_ atom
class Functor r => HasC r where Source #
Has lens to observe, set and modify c_ atom
class Functor r => HasO r where Source #
Has lens to observe, set and modify o_ atom
class Functor r => HasN r where Source #
Has lens to observe, set and modify n_ atom
Orphan instances
| FromThreeSymbols AA Source # | Parse three symbols encoding |
| ThreeSymbols AA Source # | Three symbols encoding |
Methods threeSymbols :: AA -> Text Source # | |
| FromSymbol AA Source # | Parse symbol encoding |
| Symbol AA Source # | Symbol encoding |
| IsString [AA] Source # | |
Methods fromString :: String -> [AA] # | |
| IsString (Array Int AA) Source # | |
| (Functor nr, HasRadicalType car, Functor cr) => Symbol (AminoAcid nr (Env car) cr a) Source # | Lens to get Symbol from every suitable amino acid |