clifford-0.1.0.13: A Clifford algebra library

Safe HaskellNone

Numeric.Clifford.ClassicalMechanics

Documentation

data EnergyMethod p q f Source

Constructors

Hamiltonian 

Fields

_dqs :: [DynamicSystem p q f -> Multivector p q f]
 
_dps :: [DynamicSystem p q f -> Multivector p q f]
 

data DynamicSystem p q f Source

Constructors

DynamicSystem 

Fields

_time :: f
 
coordinates :: [Multivector p q f]
 
_momenta :: [Multivector p q f]
 
_energyFunction :: EnergyMethod p q f
 
_projector :: DynamicSystem p q f -> DynamicSystem p q f
 

dqs :: forall p q f. Lens' (EnergyMethod p q f) [DynamicSystem p q f -> Multivector p q f]Source

dps :: forall p q f. Lens' (EnergyMethod p q f) [DynamicSystem p q f -> Multivector p q f]Source

time :: forall p q f. Lens' (DynamicSystem p q f) fSource

projector :: forall p q f. Lens' (DynamicSystem p q f) (DynamicSystem p q f -> DynamicSystem p q f)Source

momenta :: forall p q f. Lens' (DynamicSystem p q f) [Multivector p q f]Source

energyFunction :: forall p q f. Lens' (DynamicSystem p q f) (EnergyMethod p q f)Source

data ReferenceFrame p q t Source

Constructors

ReferenceFrame 

Fields

basisFrame :: [Multivector p q t]
 

psuedoScalar' :: forall f p q. (Ord f, C f, SingI p, SingI q) => ReferenceFrame p q f -> Multivector p q fSource

cross :: (Ord f, SingI Nat p, SingI Nat q, C f) => Multivector p q f -> Multivector p q f -> Multivector p q fSource

data PhysicalVector p q t Source

Constructors

PhysicalVector 

Fields

r :: Multivector p q t
 
referenceFrame :: ReferenceFrame p q t
 

data RigidBody p q f whereSource

Constructors

RigidBody :: (C f, C f (Multivector p q f)) => PhysicalVector p q f -> PhysicalVector p q f -> f -> PhysicalVector p q f -> PhysicalVector p q f -> PhysicalVector p q f -> RigidBody p q f 

type Vector3 f = Multivector 3 0 fSource