module Data.Drasil.Concepts.Physics where
import Language.Drasil hiding (space)
import qualified Language.Drasil.Sentence.Combinators as S
import qualified Language.Drasil.NounPhrase.Combinators as NP
import Language.Drasil.Chunk.Concept.NamedCombinators
import Data.Drasil.Domains (mathematics, physics)
import Data.Drasil.Concepts.Documentation (property, value)
import Data.Drasil.Concepts.Math (xComp, xDir, yComp, yDir, point, axis, cartesian)
import Control.Lens((^.))
import qualified Data.Drasil.Quantities.PhysicalProperties as QPP (mass)
import Data.Drasil.Citations (dampingSource)
import Data.Drasil.Concepts.Education (mechanics)
physicCon :: [ConceptChunk]
physicCon :: [ConceptChunk]
physicCon = [ConceptChunk
acceleration, ConceptChunk
angAccel, ConceptChunk
angDisp, ConceptChunk
angVelo, ConceptChunk
angFreq, ConceptChunk
angular, ConceptChunk
chgInVelocity,
ConceptChunk
cohesion, ConceptChunk
collision, ConceptChunk
compression, ConceptChunk
constAccel, ConceptChunk
constAccelV, ConceptChunk
damping, ConceptChunk
dampingCoeff,
ConceptChunk
displacement, ConceptChunk
distance, ConceptChunk
elasticity, ConceptChunk
energy, ConceptChunk
fSpeed, ConceptChunk
fVel, ConceptChunk
fbd, ConceptChunk
force,
ConceptChunk
friction, ConceptChunk
gravity, ConceptChunk
gravitationalAccel, ConceptChunk
gravitationalConst, ConceptChunk
height, ConceptChunk
iPos,
ConceptChunk
iSpeed, ConceptChunk
iVel, ConceptChunk
impulseS, ConceptChunk
impulseV, ConceptChunk
isotropy, ConceptChunk
ixPos, ConceptChunk
ixVel, ConceptChunk
ixSpeed, ConceptChunk
iySpeed, ConceptChunk
iyPos, ConceptChunk
iyVel,
ConceptChunk
joint, ConceptChunk
kEnergy, ConceptChunk
linAccel, ConceptChunk
linDisp, ConceptChunk
linVelo, ConceptChunk
linear, ConceptChunk
mechEnergy,
ConceptChunk
momentOfInertia, ConceptChunk
position, ConceptChunk
potEnergy, ConceptChunk
pressure, ConceptChunk
restitutionCoef, ConceptChunk
rectilinear,
ConceptChunk
rigidBody, ConceptChunk
scalarAccel, ConceptChunk
scalarPos, ConceptChunk
shm, ConceptChunk
space, ConceptChunk
speed, ConceptChunk
stiffCoeff, ConceptChunk
strain, ConceptChunk
stress, ConceptChunk
tension,
ConceptChunk
time, ConceptChunk
torque, ConceptChunk
velocity, ConceptChunk
weight, ConceptChunk
xAccel, ConceptChunk
xConstAccel, ConceptChunk
xDist, ConceptChunk
xPos, ConceptChunk
xVel,
ConceptChunk
yAccel, ConceptChunk
yConstAccel, ConceptChunk
yDist, ConceptChunk
yPos, ConceptChunk
yVel, ConceptChunk
momentum, ConceptChunk
chgMomentum, ConceptChunk
moment, ConceptChunk
fOfGravity, ConceptChunk
positionVec,
ConceptChunk
pendulum, ConceptChunk
body, ConceptChunk
kinematics, ConceptChunk
frequency, ConceptChunk
period, ConceptChunk
motion, ConceptChunk
horizontalMotion, ConceptChunk
verticalMotion]
physicCon' :: [CI]
physicCon' :: [CI]
physicCon' = [CI
oneD, CI
twoD, CI
threeD]
acceleration, angAccel, angDisp, angVelo, angFreq, angular, chgInVelocity, cohesion,
collision, compression, constAccel, constAccelV, damping, dampingCoeff, displacement,
distance, elasticity, energy, fSpeed, fVel, fbd, force, friction, gravity,
gravitationalAccel, gravitationalConst, height, iPos, iSpeed, iVel, impulseS,
impulseV, isotropy, ixPos, ixVel, ixSpeed, iySpeed, iyPos, iyVel, joint, kEnergy, linAccel,
linDisp, linVelo, linear, mechEnergy, momentOfInertia, position, potEnergy,
pressure, rectilinear, restitutionCoef, rigidBody, scalarAccel, scalarPos, shm,
space, speed, stiffCoeff, strain, stress, tension, time, torque, velocity, weight,
xAccel, xConstAccel, xDist, xPos, xVel, yAccel, yConstAccel, yDist,
yPos, yVel, momentum, moment, fOfGravity, positionVec, pendulum, body,
kinematics, frequency, period, motion, horizontalMotion, verticalMotion, chgMomentum :: ConceptChunk
oneD, twoD, threeD :: CI
oneD :: CI
oneD = String -> NP -> String -> [IdeaDict] -> CI
commonIdeaWithDict "oneD" (String -> NP
cn "one-dimensional") "1D" [IdeaDict
mathematics, IdeaDict
physics]
twoD :: CI
twoD = String -> NP -> String -> [IdeaDict] -> CI
commonIdeaWithDict "twoD" (String -> NP
cn "two-dimensional") "2D" [IdeaDict
mathematics, IdeaDict
physics]
threeD :: CI
threeD = String -> NP -> String -> [IdeaDict] -> CI
commonIdeaWithDict "threeD" (String -> NP
cn "three-dimensional") "3D" [IdeaDict
mathematics, IdeaDict
physics]
acceleration :: ConceptChunk
acceleration = String -> NP -> Sentence -> ConceptChunk
dccWDS "acceleration" (String -> NP
cn' "acceleration")
(String -> Sentence
S "the rate of change of a body's" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
velocity)
angular :: ConceptChunk
angular = String -> NP -> String -> ConceptChunk
dcc "angular" (String -> NP
cn' "angular")
"denoting physical properties or quantities measured with reference to or by means of an angle"
body :: ConceptChunk
body = String -> NP -> Sentence -> ConceptChunk
dccWDS "body" (String -> NP
cnIES "body")
(String -> Sentence
S "an object with" Sentence -> Sentence -> Sentence
+:+ UnitalChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase UnitalChunk
QPP.mass)
chgInVelocity :: ConceptChunk
chgInVelocity = String -> NP -> Sentence -> ConceptChunk
dccWDS "chgInVelocity" (String -> NP
cn "change in velocity")
(String -> Sentence
S "the" Sentence -> Sentence -> Sentence
+:+ NP -> Sentence
forall n. NounPhrase n => n -> Sentence
phraseNP (ConceptChunk
chgInVelocity ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`ofA` ConceptChunk
rigidBody))
chgMomentum :: ConceptChunk
chgMomentum = String -> NP -> Sentence -> ConceptChunk
dccWDS "chgMomentum" (String -> NP
cn' "change in momentum")
(String -> Sentence
S "The rate of change of a body's" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
impulseV)
collision :: ConceptChunk
collision = String -> NP -> String -> ConceptChunk
dcc "collision" (String -> NP
cn' "collision")
"an encounter between particles resulting in an exchange or transformation of energy"
cohesion :: ConceptChunk
cohesion = String -> NP -> Sentence -> ConceptChunk
dccWDS "cohesion" (String -> NP
cn "cohesion")
(String -> Sentence
S "an attractive" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
force Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "between adjacent particles that holds the matter together")
compression :: ConceptChunk
compression = String -> NP -> Sentence -> ConceptChunk
dccWDS "compression" (String -> NP
cn' "compression")
(String -> Sentence
S "a" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
stress Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "that causes displacement of the body towards its center")
damping :: ConceptChunk
damping = String -> NP -> Sentence -> ConceptChunk
dccWDS "damping" (String -> NP
pn' "damping")
(Sentence -> ConceptChunk) -> Sentence -> ConceptChunk
forall a b. (a -> b) -> a -> b
$ String -> Sentence
S "an influence within or upon an oscillatory system that has the effect of reducing," Sentence -> Sentence -> Sentence
+:+
String -> Sentence
S "restricting or preventing its oscillations" Sentence -> Sentence -> Sentence
+:+ Citation -> Sentence
forall r. (Referable r, HasShortName r) => r -> Sentence
fromSource Citation
dampingSource
dampingCoeff :: ConceptChunk
dampingCoeff = String -> NP -> String -> ConceptChunk
dcc "dampingCoeff" (String -> NP
cn' "damping coefficient")
"Quantity that characterizes a second order system's oscillatory response"
displacement :: ConceptChunk
displacement = String -> NP -> Sentence -> ConceptChunk
dccWDS "displacement" (String -> NP
cn' "displacement")
(String -> Sentence
S "the change in" Sentence -> Sentence -> Sentence
+:+ (ConceptChunk
position ConceptChunk -> Getting Sentence ConceptChunk Sentence -> Sentence
forall s a. s -> Getting a s a -> a
^. Getting Sentence ConceptChunk Sentence
forall c. Definition c => Lens' c Sentence
defn))
distance :: ConceptChunk
distance = String -> NP -> String -> ConceptChunk
dcc "distance" (String -> NP
cn' "distance")
"the interval measured along a path connecting two locations"
elasticity :: ConceptChunk
elasticity = String -> NP -> String -> ConceptChunk
dcc "elasticity" (String -> NP
cnIES "elasticity")
"the ratio of the relative velocities of two colliding objects after and before a collision"
energy :: ConceptChunk
energy = String -> NP -> String -> ConceptChunk
dcc "energy" (String -> NP
cn "energy")
"power derived from the utilization of physical or chemical resources"
fbd :: ConceptChunk
fbd = String -> NP -> String -> ConceptChunk
dcc "FBD" (String -> NP
cn' "free body diagram")
("a graphical illustration used to visualize the applied forces, movements, and resulting " String -> String -> String
forall a. [a] -> [a] -> [a]
++
"reactions on a body in a steady state condition")
force :: ConceptChunk
force = String -> NP -> String -> ConceptChunk
dcc "force" (String -> NP
cn' "force")
"an interaction that tends to produce change in the motion of an object"
frequency :: ConceptChunk
frequency = String -> NP -> String -> ConceptChunk
dcc "frequency" (String -> NP
cn' "frequency")
"the number of occurrences of a repeating event per unit of time"
friction :: ConceptChunk
friction = String -> NP -> String -> ConceptChunk
dcc "friction" (String -> NP
cn' "friction")
"the force resisting the relative motion of two surfaces"
fOfGravity :: ConceptChunk
fOfGravity = String -> NP -> String -> ConceptChunk
dcc "fOfGravity" (String -> NP
cn "force of gravity")
"the force exerted by gravity on an object"
gravity :: ConceptChunk
gravity = String -> NP -> String -> ConceptChunk
dcc "gravity" (String -> NP
cn "gravity")
"the force that attracts one physical body with mass to another"
gravitationalAccel :: ConceptChunk
gravitationalAccel = String -> NP -> String -> ConceptChunk
dcc "gravitationalAccel" (String -> NP
cn "gravitational acceleration")
"the approximate acceleration due to gravity on Earth at sea level"
gravitationalConst :: ConceptChunk
gravitationalConst = String -> NP -> String -> ConceptChunk
dcc "gravitationalConst" (String -> NP
cn "gravitational constant")
"the empirical physical constant used to show the force between two objects caused by gravity"
height :: ConceptChunk
height = String -> NP -> Sentence -> ConceptChunk
dccWDS "height" (String -> NP
cn' "height")
(String -> Sentence
S "the" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
distance Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "above a reference point for a point of interest")
horizontalMotion :: ConceptChunk
horizontalMotion = String -> NP -> Sentence -> ConceptChunk
dccWDS "horizontalMotion" (String -> NP
cn "horizontal motion")
(String -> Sentence
S "the result of the tendency of any object in motion to remain in motion at constant velocity")
isotropy :: ConceptChunk
isotropy = String -> NP -> Sentence -> ConceptChunk
dccWDS "isotropy" (String -> NP
cn "isotropy")
(String -> Sentence
S "a condition where the" Sentence -> Sentence -> Sentence
+:+ NP -> Sentence
forall n. NounPhrase n => n -> Sentence
phraseNP (NamedChunk
value NamedChunk -> NamedChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`ofA` NamedChunk
property) Sentence -> Sentence -> Sentence
`S.is`
String -> Sentence
S "independent of the direction in which it is measured")
joint :: ConceptChunk
joint = String -> NP -> String -> ConceptChunk
dcc "joint" (String -> NP
cn' "joint")
"a connection between two rigid bodies which allows movement with one or more degrees of freedom"
kEnergy :: ConceptChunk
kEnergy = String -> NP -> Sentence -> ConceptChunk
dccWDS "kEnergy" (String -> NP
cn "kinetic energy")
(String -> Sentence
S "measure" Sentence -> Sentence -> Sentence
`S.the_ofThe` ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
energy Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "a body possesses due to its motion")
kinematics :: ConceptChunk
kinematics = String -> NP -> Sentence -> ConceptChunk
dccWDS "kinematics" (String -> NP
cn "kinematics")
(String -> Sentence
S "branch" Sentence -> Sentence -> Sentence
`S.of_` NamedChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase NamedChunk
mechanics Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "that describes the motion" Sentence -> Sentence -> Sentence
`S.of_`
String -> Sentence
S "objects without reference to the causes of motion")
linear :: ConceptChunk
linear = String -> NP -> String -> ConceptChunk
dcc "linear" (String -> NP
cn' "linear")
"arranged in or extending along a straight or nearly straight line"
mechEnergy :: ConceptChunk
mechEnergy = String -> NP -> String -> ConceptChunk
dcc "mechEnergy" (String -> NP
cn "mechanical energy")
"the energy that comes from motion and position"
momentum :: ConceptChunk
momentum = String -> NP -> Sentence -> ConceptChunk
dccWDS "momentum" (String -> NP
cn "momentum")
( String -> Sentence
S "the quantity of motion" Sentence -> Sentence -> Sentence
`S.of_` String -> Sentence
S "a moving body, measured as a product" Sentence -> Sentence -> Sentence
`S.of_`
NP -> Sentence
forall n. NounPhrase n => n -> Sentence
phraseNP (UnitalChunk
QPP.mass UnitalChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`and_` ConceptChunk
velocity))
moment :: ConceptChunk
moment = String -> NP -> Sentence -> ConceptChunk
dccWDS "moment" (String -> NP
cn' "moment")
(String -> Sentence
S "A measure of the tendency of a body to rotate about a specific" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
point Sentence -> Sentence -> Sentence
`S.or_` ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
axis)
motion :: ConceptChunk
motion = String -> NP -> Sentence -> ConceptChunk
dccWDS "motion" (String -> NP
cn "motion")
(String -> Sentence
S "change in position of a physical body over time")
period :: ConceptChunk
period = String -> NP -> Sentence -> ConceptChunk
dccWDS "period" (String -> NP
cn' "period")
(String -> Sentence
S "the" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
time Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "required for one complete cycle of vibration to pass a given point.")
pendulum :: ConceptChunk
pendulum = String -> NP -> Sentence -> ConceptChunk
dccWDS "pendulum" (String -> NP
cn "pendulum")
(String -> Sentence
S "a body suspended from a fixed support so that it swings freely back and forth under the influence"
Sentence -> Sentence -> Sentence
`S.of_` ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
gravity)
position :: ConceptChunk
position = String -> NP -> String -> ConceptChunk
dcc "position" (String -> NP
cn' "position")
"an object's location relative to a reference point"
positionVec :: ConceptChunk
positionVec = String -> NP -> Sentence -> ConceptChunk
dccWDS "positionVec" (String -> NP
cn' "position vector")
(String -> Sentence
S "a vector from the origin" Sentence -> Sentence -> Sentence
`S.ofThe` ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
cartesian Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "defined"
Sentence -> Sentence -> Sentence
`S.toThe` ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
point Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "where the" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
force Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "is applied")
potEnergy :: ConceptChunk
potEnergy = String -> NP -> Sentence -> ConceptChunk
dccWDS "potEnergy" (String -> NP
cn "potential energy")
(String -> Sentence
S "measure" Sentence -> Sentence -> Sentence
`S.the_ofThe` ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
energy Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "held by an object because of its" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
position)
pressure :: ConceptChunk
pressure = String -> NP -> Sentence -> ConceptChunk
dccWDS "pressure" (String -> NP
cn' "pressure")
(String -> Sentence
S "a" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
force Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "exerted over an area")
rectilinear :: ConceptChunk
rectilinear = String -> NP -> String -> ConceptChunk
dcc "rectilinear" (String -> NP
cn "rectilinear")
"occuring in one dimension"
rigidBody :: ConceptChunk
rigidBody = String -> NP -> String -> ConceptChunk
dcc "rigidBody" (String -> NP
cnIES "rigid body")
"a solid body in which deformation is neglected"
space :: ConceptChunk
space = String -> NP -> String -> ConceptChunk
dcc "space" (String -> NP
cn' "space")
"a two-dimensional extent where objects and events have relative positions and directions"
scalarAccel :: ConceptChunk
scalarAccel = String -> NP -> Sentence -> ConceptChunk
dccWDS "scalarAccel" (String -> NP
cn' "scalar acceleration")
(String -> Sentence
S "magnitude" Sentence -> Sentence -> Sentence
`S.the_ofThe` ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
acceleration Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "vector")
scalarPos :: ConceptChunk
scalarPos = String -> NP -> Sentence -> ConceptChunk
dccWDS "scalarPos" (String -> NP
cn' "scalar position")
(String -> Sentence
S "magnitude" Sentence -> Sentence -> Sentence
`S.the_ofThe` ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
position Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "vector")
shm :: ConceptChunk
shm = String -> NP -> String -> ConceptChunk
dcc "SHM" (String -> NP
nounPhraseSP "simple harmonic motion") ("Periodic motion through an equilibrium position. " String -> String -> String
forall a. [a] -> [a] -> [a]
++
"The motion is sinusoidal in time and demonstrates a" String -> String -> String
forall a. [a] -> [a] -> [a]
++
" single resonant frequency")
speed :: ConceptChunk
speed = String -> NP -> Sentence -> ConceptChunk
dccWDS "speed" (String -> NP
cn' "speed")
(String -> Sentence
S "magnitude" Sentence -> Sentence -> Sentence
`S.the_ofThe` ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
velocity Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "vector")
stiffCoeff :: ConceptChunk
stiffCoeff = String -> NP -> String -> ConceptChunk
dcc "stiffnessCoeff" (String -> NP
cn' "stiffness coefficient")
"Quantity that characterizes a spring's stiffness"
strain :: ConceptChunk
strain = String -> NP -> Sentence -> ConceptChunk
dccWDS "strain" (String -> NP
cn' "strain")
(String -> Sentence
S "a measure of deformation representing the" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
displacement Sentence -> Sentence -> Sentence
+:+
String -> Sentence
S "between particles in the body relative to a reference length")
stress :: ConceptChunk
stress = String -> NP -> String -> ConceptChunk
dcc "stress" (String -> NP
cn''' "stress")
"the ratio of an applied force to a cross-sectional area"
tension :: ConceptChunk
tension = String -> NP -> Sentence -> ConceptChunk
dccWDS "tension" (String -> NP
cn' "tension")
(String -> Sentence
S "a" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
stress Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "that causes displacement of the body away from its center")
time :: ConceptChunk
time = String -> NP -> String -> ConceptChunk
dcc "time" (String -> NP
cn' "time")
"the indefinite continued progress of existence and events in the past, present, and future regarded as a whole"
torque :: ConceptChunk
torque = String -> NP -> String -> ConceptChunk
dcc "torque" (String -> NP
cn' "torque")
"a twisting force that tends to cause rotation"
velocity :: ConceptChunk
velocity = String -> NP -> Sentence -> ConceptChunk
dccWDS "velocity" (String -> NP
cnIES "velocity")
(String -> Sentence
S "the rate of change of a body's" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
position)
verticalMotion :: ConceptChunk
verticalMotion = String -> NP -> Sentence -> ConceptChunk
dccWDS "verticalMotion" (String -> NP
cn "vertical motion")
(String -> Sentence
S " the movement of the object against the gravitational pull")
weight :: ConceptChunk
weight = String -> NP -> String -> ConceptChunk
dcc "weight" (String -> NP
cn' "weight")
"the gravitational force acting on an object"
xDist :: ConceptChunk
xDist = String -> NP -> Sentence -> ConceptChunk
dccWDS "xDist" (ConceptChunk
distance ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`inThe` ConceptChunk
xDir) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ ConceptChunk
distance ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`inThe` ConceptChunk
xDir)
yDist :: ConceptChunk
yDist = String -> NP -> Sentence -> ConceptChunk
dccWDS "yDist" (ConceptChunk
distance ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`inThe` ConceptChunk
yDir) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ ConceptChunk
distance ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`inThe` ConceptChunk
yDir)
iPos :: ConceptChunk
iPos = String -> NP -> Sentence -> ConceptChunk
dccWDS "iPos" (String -> NP
cn "initial position") (String -> Sentence
S "The" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
position Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "at the body's initial point")
xPos :: ConceptChunk
xPos = String -> NP -> Sentence -> ConceptChunk
dccWDS "xPos" (ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
position) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
position)
yPos :: ConceptChunk
yPos = String -> NP -> Sentence -> ConceptChunk
dccWDS "yPos" (ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
position) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
position)
ixPos :: ConceptChunk
ixPos = String -> NP -> Sentence -> ConceptChunk
dccWDS "ixPos" (ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iPos) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iPos)
iyPos :: ConceptChunk
iyPos = String -> NP -> Sentence -> ConceptChunk
dccWDS "iyPos" (ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iPos) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iPos)
fSpeed :: ConceptChunk
fSpeed = String -> NP -> Sentence -> ConceptChunk
dccWDS "fSpeed" (String -> NP
cn "final speed") (String -> Sentence
S "The" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
speed Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "at the body's final point")
iSpeed :: ConceptChunk
iSpeed = String -> NP -> Sentence -> ConceptChunk
dccWDS "iSpeed" (String -> NP
cn "initial speed") (String -> Sentence
S "The" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
speed Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "at the body's initial point")
ixSpeed :: ConceptChunk
ixSpeed = String -> NP -> Sentence -> ConceptChunk
dccWDS "ixSpeed" (ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iSpeed) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iSpeed)
iySpeed :: ConceptChunk
iySpeed = String -> NP -> Sentence -> ConceptChunk
dccWDS "iySpeed" (ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iSpeed) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iSpeed)
fVel :: ConceptChunk
fVel = String -> NP -> Sentence -> ConceptChunk
dccWDS "fVel" (String -> NP
cn "final velocity") (String -> Sentence
S "The" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
velocity Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "at the body's final point")
iVel :: ConceptChunk
iVel = String -> NP -> Sentence -> ConceptChunk
dccWDS "iVel" (String -> NP
cn "initial velocity") (String -> Sentence
S "The" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
velocity Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "at the body's initial point")
xVel :: ConceptChunk
xVel = String -> NP -> Sentence -> ConceptChunk
dccWDS "xVel" (ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
velocity) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
velocity)
yVel :: ConceptChunk
yVel = String -> NP -> Sentence -> ConceptChunk
dccWDS "yVel" (ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
velocity) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
velocity)
ixVel :: ConceptChunk
ixVel = String -> NP -> Sentence -> ConceptChunk
dccWDS "ixVel" (ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iVel) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iVel)
iyVel :: ConceptChunk
iyVel = String -> NP -> Sentence -> ConceptChunk
dccWDS "iyVel" (ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iVel) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
iVel)
xAccel :: ConceptChunk
xAccel = String -> NP -> Sentence -> ConceptChunk
dccWDS "xScalAcc" (ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
acceleration) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
acceleration)
yAccel :: ConceptChunk
yAccel = String -> NP -> Sentence -> ConceptChunk
dccWDS "yScalAcc" (ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
acceleration) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
acceleration)
constAccelV :: ConceptChunk
constAccelV = String -> NP -> Sentence -> ConceptChunk
dccWDS "constAccelV" (String -> NP
cn "constant acceleration vector") (String -> Sentence
S "The" Sentence -> Sentence -> Sentence
+:+ ConceptChunk -> Sentence
forall n. (HasUID n, NamedIdea n) => n -> Sentence
phrase ConceptChunk
constAccel Sentence -> Sentence -> Sentence
+:+ String -> Sentence
S "vector")
xConstAccel :: ConceptChunk
xConstAccel = String -> NP -> Sentence -> ConceptChunk
dccWDS "xConstAccel" (ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
constAccel) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
xComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
constAccel)
yConstAccel :: ConceptChunk
yConstAccel = String -> NP -> Sentence -> ConceptChunk
dccWDS "yConstAccel" (ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
constAccel) (NP -> Sentence
forall n. NounPhrase n => n -> Sentence
atStartNP (NP -> Sentence) -> NP -> Sentence
forall a b. (a -> b) -> a -> b
$ NP -> NP
NP.the (NP -> NP) -> NP -> NP
forall a b. (a -> b) -> a -> b
$ ConceptChunk
yComp ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
`of_` ConceptChunk
constAccel)
angDisp :: ConceptChunk
angDisp = String -> NP -> String -> ConceptChunk
dcc "angularDisplacement" (ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
combineNINI ConceptChunk
angular ConceptChunk
displacement)
"the angle through which an object moves on a circular path"
angVelo :: ConceptChunk
angVelo = String -> NP -> String -> ConceptChunk
dcc "angularVelocity" (ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
combineNINI ConceptChunk
angular ConceptChunk
velocity)
"the rate of change of angular position of a rotating body"
angAccel :: ConceptChunk
angAccel = String -> NP -> String -> ConceptChunk
dcc "angularAcceleration" (ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
combineNINI ConceptChunk
angular ConceptChunk
acceleration)
"the rate of change of angular velocity"
constAccel :: ConceptChunk
constAccel = String -> NP -> String -> ConceptChunk
dcc "constantAcceleration" (String -> NP
cn "constant acceleration")
"a one-dimensional acceleration that is constant"
linDisp :: ConceptChunk
linDisp = String -> NP -> String -> ConceptChunk
dcc "linearDisplacement" (ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
combineNINI ConceptChunk
linear ConceptChunk
displacement)
"movement in one direction along a single axis"
linVelo :: ConceptChunk
linVelo = String -> NP -> String -> ConceptChunk
dcc "linearVelocity" (ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
combineNINI ConceptChunk
linear ConceptChunk
velocity)
"the speed of a moving object, dependent on the perspective taken"
linAccel :: ConceptChunk
linAccel = String -> NP -> String -> ConceptChunk
dcc "linearAcceleration" (ConceptChunk -> ConceptChunk -> NP
forall c d. (NamedIdea c, NamedIdea d) => c -> d -> NP
combineNINI ConceptChunk
linear ConceptChunk
acceleration)
"the rate of change of velocity without a change in direction"
restitutionCoef :: ConceptChunk
restitutionCoef = String -> NP -> String -> ConceptChunk
dcc "restitutionCoef" (String -> NP
cn "coefficient of restitution")
"a measure of the restitution of a collision between two objects"
momentOfInertia :: ConceptChunk
momentOfInertia = String -> NP -> String -> ConceptChunk
dcc "momentOfInertia" (String -> NP
cn "moment of inertia")
"a quantity expressing a body's tendency to resist angular acceleration"
angFreq :: ConceptChunk
angFreq = String -> NP -> String -> ConceptChunk
dcc "angularFrequency" (String -> NP
cn "angular frequency")
"the frequency of a periodic process, wave system etc, per unit time."
impulseV :: ConceptChunk
impulseV = String -> NP -> String -> ConceptChunk
dcc "impulseV" (String -> NP
cn "impulse (vector)")
"a force acting briefly on a body and producing a finite change of momentum in a given direction"
impulseS :: ConceptChunk
impulseS = String -> NP -> String -> ConceptChunk
dcc "impulseS" (String -> NP
cn "impulse (scalar)")
"a force acting briefly on a body and producing a finite change of momentum"