2021-01-02 12:32:20 +00:00
|
|
|
{-# LANGUAGE AllowAmbiguousTypes #-}
|
2021-01-19 20:46:07 +00:00
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
2020-12-27 04:19:51 +00:00
|
|
|
module Classes.Physics.Collidible where
|
|
|
|
|
2021-01-19 20:46:07 +00:00
|
|
|
import Affection as A
|
|
|
|
|
2020-12-27 04:19:51 +00:00
|
|
|
import Linear
|
|
|
|
|
2021-01-19 20:46:07 +00:00
|
|
|
import Data.String (fromString)
|
|
|
|
|
2021-01-20 06:13:04 +00:00
|
|
|
import Data.List (minimumBy)
|
|
|
|
|
2020-12-27 04:30:57 +00:00
|
|
|
-- internal imports
|
|
|
|
|
|
|
|
import Classes.Physics.Mass
|
|
|
|
|
2021-01-17 19:29:27 +00:00
|
|
|
data CollisionResult time direction
|
2021-01-17 01:30:45 +00:00
|
|
|
= NoCollision
|
2021-02-27 15:08:45 +00:00
|
|
|
| Collision
|
|
|
|
{ collisionTime :: time
|
|
|
|
, collisionDirection :: direction
|
|
|
|
}
|
2021-01-17 01:30:45 +00:00
|
|
|
deriving (Show, Eq)
|
|
|
|
|
2020-12-27 04:19:51 +00:00
|
|
|
-- | Typeclass for implementing collision results on objects.
|
2021-01-02 12:32:20 +00:00
|
|
|
class (Show c, Mass c) => Collidible c where
|
2020-12-27 04:19:51 +00:00
|
|
|
|
2021-01-02 12:32:20 +00:00
|
|
|
-- | returns the bottom left and top right corners relative to the objects
|
|
|
|
-- positional vector of the axis aligned bounding box (AABB) serving here
|
|
|
|
-- as collision boundaries.
|
2020-12-27 04:19:51 +00:00
|
|
|
boundary
|
2021-01-02 12:32:20 +00:00
|
|
|
:: c -- ^ Object
|
|
|
|
-> ( V2 Double -- ^ Bottom left corner of AABB relative to position
|
|
|
|
, V2 Double -- ^ Top right corner of AABB relative to position
|
2020-12-27 04:19:51 +00:00
|
|
|
)
|
2021-01-02 12:32:20 +00:00
|
|
|
|
|
|
|
collisionCheck
|
|
|
|
:: (Collidible other)
|
2021-01-17 19:29:27 +00:00
|
|
|
=> Double -- ^ Time step length
|
|
|
|
-> c -- ^ First object
|
|
|
|
-> other -- ^ second object
|
|
|
|
-> CollisionResult Double (V2 Int) -- ^ Do the objects collide?
|
2021-01-02 21:46:46 +00:00
|
|
|
collisionCheck dt m1 m2 =
|
2021-01-19 20:46:07 +00:00
|
|
|
let d1@(V2 d1x d1y) = velocity m1
|
|
|
|
d2@(V2 d2x d2y) = velocity m2
|
2021-01-14 22:08:24 +00:00
|
|
|
p1 = position m1
|
|
|
|
p2 = position m2
|
|
|
|
(m1b1@(V2 m1b1x m1b1y), m1b2@(V2 m1b2x m1b2y)) = boundary m1
|
|
|
|
(m2b1@(V2 m2b1x m2b1y), m2b2@(V2 m2b2x m2b2y)) = boundary m2
|
2021-02-27 15:08:45 +00:00
|
|
|
m1p1 = p1 + m1b1
|
|
|
|
m1p2 = p1 + V2 m1b1x m1b2y
|
|
|
|
m1p3 = p1 + m1b2
|
|
|
|
m1p4 = p1 + V2 m1b2x m1b1y
|
|
|
|
m2p1 = p2 + m2b1
|
|
|
|
m2p2 = p2 + V2 m2b1x m2b2y
|
|
|
|
m2p3 = p2 + m2b2
|
|
|
|
m2p4 = p2 + V2 m2b2x m2b1y
|
2021-04-16 16:46:01 +00:00
|
|
|
-- g11 = (m1p1, m1p2)
|
|
|
|
-- g12 = (m1p2, m1p3)
|
|
|
|
-- g13 = (m1p3, m1p4)
|
|
|
|
-- g14 = (m1p4, m1p1)
|
|
|
|
-- g21 = (m2p1, m2p2)
|
|
|
|
-- g22 = (m2p2, m2p3)
|
|
|
|
-- g23 = (m2p3, m2p4)
|
|
|
|
-- g24 = (m2p4, m2p1)
|
|
|
|
-- g1s = [g11, g12, g13, g14]
|
|
|
|
-- g2s = [g21, g22, g23, g24]
|
2021-02-27 15:08:45 +00:00
|
|
|
b1 =
|
|
|
|
( V2
|
|
|
|
((\(V2 x _) -> x) (if d1x < 0 then m1p1 + ((dt *) <$> d1) else m1p1))
|
|
|
|
((\(V2 _ y) -> y) (if d1y < 0 then m1p1 + ((dt *) <$> d1) else m1p1))
|
|
|
|
, V2
|
|
|
|
((\(V2 x _) -> x) (if d1x < 0 then m1p3 else m1p3 + ((dt *) <$> d1)))
|
|
|
|
((\(V2 _ y) -> y) (if d1y < 0 then m1p3 else m1p3 + ((dt *) <$> d1)))
|
|
|
|
)
|
|
|
|
b2 =
|
|
|
|
( V2
|
|
|
|
((\(V2 x _) -> x) (if d2x < 0 then m2p1 + ((dt *) <$> d2) else m2p1))
|
|
|
|
((\(V2 _ y) -> y) (if d2y < 0 then m2p1 + ((dt *) <$> d2) else m2p1))
|
|
|
|
, V2
|
|
|
|
((\(V2 x _) -> x) (if d2x < 0 then m2p3 else m2p3 + ((dt *) <$> d2)))
|
|
|
|
((\(V2 _ y) -> y) (if d2y < 0 then m2p3 else m2p3 + ((dt *) <$> d2)))
|
|
|
|
)
|
|
|
|
broadphaseOverlap =
|
|
|
|
let b11@(V2 b1minx b1miny) = fst b1
|
|
|
|
b12@(V2 b1maxx b1maxy) = snd b1
|
|
|
|
b21@(V2 b2minx b2miny) = fst b2
|
|
|
|
b22@(V2 b2maxx b2maxy) = snd b2
|
|
|
|
in2 =
|
2021-03-04 00:56:42 +00:00
|
|
|
(b1minx > b2minx && b1minx < b2maxx &&
|
|
|
|
b1miny > b2miny && b1miny < b2maxy) ||
|
|
|
|
(b1maxx > b2minx && b1maxx < b2maxx &&
|
|
|
|
b1miny > b2miny && b1miny < b2maxy) ||
|
|
|
|
(b1minx > b2minx && b1minx < b2maxx &&
|
|
|
|
b1maxy > b2miny && b1maxy < b2maxy) ||
|
|
|
|
(b1maxx > b2minx && b1maxx < b2maxx &&
|
|
|
|
b1maxy > b2miny && b1maxy < b2maxy)
|
2021-02-27 15:08:45 +00:00
|
|
|
in1 =
|
2021-03-04 00:56:42 +00:00
|
|
|
(b2minx > b1minx && b2minx < b1maxx &&
|
|
|
|
b2miny > b1miny && b2miny < b1maxy) ||
|
|
|
|
(b2maxx > b1minx && b2maxx < b1maxx &&
|
|
|
|
b2miny > b1miny && b2miny < b1maxy) ||
|
|
|
|
(b2minx > b1minx && b2minx < b1maxx &&
|
|
|
|
b2maxy > b1miny && b2maxy < b1maxy) ||
|
|
|
|
(b2maxx > b1minx && b2maxx < b1maxx &&
|
|
|
|
b2maxy > b1miny && b2maxy < b1maxy)
|
2021-01-20 06:13:04 +00:00
|
|
|
in
|
2021-02-27 15:08:45 +00:00
|
|
|
in2 || in1
|
|
|
|
tx =
|
2021-04-16 16:46:01 +00:00
|
|
|
let p1x = (\(V2 x _) -> x) (if d1x < 0 then m1p1 else m1p4)
|
|
|
|
p2x = (\(V2 x _) -> x) (if d1x < 0 then m2p4 else m2p1)
|
2021-01-20 06:13:04 +00:00
|
|
|
in
|
2021-03-04 00:56:42 +00:00
|
|
|
if d2x - d1x == 0 then dt else (p1x - p2x) / (d2x - d1x)
|
2021-02-27 15:08:45 +00:00
|
|
|
ty =
|
2021-04-16 16:46:01 +00:00
|
|
|
let p1y = (\(V2 _ y) -> y) (if d1y < 0 then m1p1 else m1p2)
|
|
|
|
p2y = (\(V2 _ y) -> y) (if d1y < 0 then m2p2 else m2p1)
|
2021-01-14 22:08:24 +00:00
|
|
|
in
|
2021-03-04 00:56:42 +00:00
|
|
|
if d2y - d1y == 0 then dt else (p1y - p2y) / (d2y - d1y)
|
2021-01-02 12:32:20 +00:00
|
|
|
in
|
2021-03-04 00:56:42 +00:00
|
|
|
if broadphaseOverlap
|
2021-02-27 15:08:45 +00:00
|
|
|
then
|
2021-04-16 19:47:02 +00:00
|
|
|
let collx =
|
|
|
|
if d1x < 0
|
|
|
|
then
|
|
|
|
let (V2 _ g1s) = m1p1 + ((tx *) <$> d1)
|
|
|
|
(V2 _ g1e) = m1p2 + ((tx *) <$> d1)
|
|
|
|
(V2 _ g2s) = m2p4 + ((tx *) <$> d2)
|
|
|
|
(V2 _ g2e) = m2p3 + ((tx *) <$> d2)
|
|
|
|
s11 = (g1s - g2s) / (g2e - g2s)
|
|
|
|
s12 = (g1e - g2s) / (g2e - g2s)
|
|
|
|
s21 = (g2s - g1s) / (g1e - g1s)
|
|
|
|
s22 = (g2e - g1s) / (g1e - g1s)
|
|
|
|
in
|
|
|
|
any (\x -> x > 0 && x < 1) [s11, s12, s21 ,s22]
|
|
|
|
else
|
|
|
|
let (V2 _ g1s) = m1p4 + ((tx *) <$> d1)
|
|
|
|
(V2 _ g1e) = m1p3 + ((tx *) <$> d1)
|
|
|
|
(V2 _ g2s) = m2p1 + ((tx *) <$> d2)
|
|
|
|
(V2 _ g2e) = m2p2 + ((tx *) <$> d2)
|
|
|
|
s11 = (g1s - g2s) / (g2e - g2s)
|
|
|
|
s12 = (g1e - g2s) / (g2e - g2s)
|
|
|
|
s21 = (g2s - g1s) / (g1e - g1s)
|
|
|
|
s22 = (g2e - g1s) / (g1e - g1s)
|
|
|
|
in
|
|
|
|
any (\x -> x > 0 && x < 1) [s11, s12, s21 ,s22]
|
|
|
|
colly =
|
|
|
|
if d1y < 0
|
|
|
|
then
|
|
|
|
let (V2 g1s _) = m1p1 + ((ty *) <$> d1)
|
|
|
|
(V2 g1e _) = m1p4 + ((ty *) <$> d1)
|
|
|
|
(V2 g2s _) = m2p2 + ((ty *) <$> d2)
|
|
|
|
(V2 g2e _) = m2p3 + ((ty *) <$> d2)
|
|
|
|
s11 = (g1s - g2s) / (g2e - g2s)
|
|
|
|
s12 = (g1e - g2s) / (g2e - g2s)
|
|
|
|
s21 = (g2s - g1s) / (g1e - g1s)
|
|
|
|
s22 = (g2e - g1s) / (g1e - g1s)
|
|
|
|
in
|
|
|
|
any (\x -> x > 0 && x < 1) [s11, s12, s21 ,s22]
|
|
|
|
else
|
|
|
|
let (V2 g1s _) = m1p2 + ((ty *) <$> d1)
|
|
|
|
(V2 g1e _) = m1p3 + ((ty *) <$> d1)
|
|
|
|
(V2 g2s _) = m2p1 + ((ty *) <$> d2)
|
|
|
|
(V2 g2e _) = m2p4 + ((ty *) <$> d2)
|
|
|
|
s11 = (g1s - g2s) / (g2e - g2s)
|
|
|
|
s12 = (g1e - g2s) / (g2e - g2s)
|
|
|
|
s21 = (g2s - g1s) / (g1e - g1s)
|
|
|
|
s22 = (g2e - g1s) / (g1e - g1s)
|
|
|
|
in
|
|
|
|
any (\x -> x > 0 && x < 1) [s11, s12, s21 ,s22]
|
|
|
|
in
|
|
|
|
case (tx < dt, ty < dt, tx < ty, collx, colly) of
|
|
|
|
(_, _, True, True, _) ->
|
|
|
|
Collision tx (V2 (floor $ signum d1x) 0)
|
|
|
|
(_, _, False, _, True) ->
|
|
|
|
Collision ty (V2 0 (floor $ signum d1y))
|
|
|
|
(_, _, _, False, False) ->
|
|
|
|
NoCollision
|
|
|
|
--(True, _, _, False, _) ->
|
|
|
|
-- NoCollision
|
|
|
|
-- (_, True, _, _, False) ->
|
|
|
|
-- NoCollision
|
|
|
|
-- (False, _, _, _, _) ->
|
|
|
|
-- NoCollision
|
|
|
|
-- (_, False, _, _, _) ->
|
|
|
|
-- NoCollision
|
2021-02-27 15:08:45 +00:00
|
|
|
else
|
|
|
|
NoCollision
|
2021-01-02 12:32:20 +00:00
|
|
|
|
|
|
|
-- | This Function is called for every collision on both colliding objects.
|
2020-12-27 04:19:51 +00:00
|
|
|
collide
|
2021-01-02 12:32:20 +00:00
|
|
|
:: (Collidible other)
|
2021-01-17 19:29:27 +00:00
|
|
|
=> c -- ^ Original object
|
|
|
|
-> other -- ^ Collision partner
|
|
|
|
-> CollisionResult Double (V2 Int) -- ^ Collision reaction
|
|
|
|
-> c -- ^ Updated original object
|
2021-01-12 02:12:02 +00:00
|
|
|
collide = elasticCollision 1
|
2021-01-02 12:32:20 +00:00
|
|
|
|
|
|
|
-- | Implementation of a dampened elastic collision used as default collision
|
|
|
|
-- implementation of the collision reaction
|
|
|
|
elasticCollision
|
|
|
|
:: (Collidible c1, Collidible c2)
|
|
|
|
=> Double
|
|
|
|
-> c1
|
|
|
|
-> c2
|
2021-01-17 19:29:27 +00:00
|
|
|
-> CollisionResult Double (V2 Int)
|
2021-01-02 12:32:20 +00:00
|
|
|
-> c1
|
2021-01-17 01:30:45 +00:00
|
|
|
elasticCollision _ mo1 _ NoCollision = mo1
|
2021-01-20 03:40:57 +00:00
|
|
|
elasticCollision damping mo1 mo2 (Collision ddt (V2 dirx diry)) =
|
2021-01-17 01:30:45 +00:00
|
|
|
let v1@(V2 v1x v1y) = velocity mo1
|
2021-01-02 12:32:20 +00:00
|
|
|
(V2 v2x v2y) = velocity mo2
|
2021-01-03 00:43:37 +00:00
|
|
|
p1@(V2 p1x p1y) = position mo1
|
|
|
|
p2 = position mo2
|
|
|
|
(V2 m1x1 m1y1, V2 m1x2 m1y2) = boundary mo1
|
|
|
|
(V2 m2x1 m2y1, V2 m2x2 m2y2) = boundary mo2
|
2021-01-02 12:32:20 +00:00
|
|
|
m1 = mass mo1
|
|
|
|
m2 = mass mo2
|
|
|
|
v1x' = 2 * (m1 * v1x + m2 * v2x) / (m1 + m2) - v1x
|
|
|
|
v1y' = 2 * (m1 * v1y + m2 * v2y) / (m1 + m2) - v1y
|
2021-01-03 00:43:37 +00:00
|
|
|
(V2 dx dy) = p2 - p1
|
2021-01-14 22:08:24 +00:00
|
|
|
nvel@(V2 nvx nvy) = if m1 == recip 0
|
2021-01-02 12:32:20 +00:00
|
|
|
then V2 0 0
|
|
|
|
else (damping *) <$>
|
|
|
|
if m2 == recip 0
|
2021-01-14 22:08:24 +00:00
|
|
|
then
|
2021-03-22 05:36:28 +00:00
|
|
|
if abs dirx > 0
|
2021-01-12 02:12:02 +00:00
|
|
|
then (V2 (-v1x) v1y)
|
|
|
|
else (V2 v1x (-v1y))
|
2021-01-02 12:32:20 +00:00
|
|
|
else (V2 v1x' v1y')
|
2021-01-19 11:50:15 +00:00
|
|
|
bx = if dx < 0
|
2021-01-17 01:30:45 +00:00
|
|
|
then
|
2021-01-19 11:50:15 +00:00
|
|
|
if abs dx > abs m1x1 + abs m2x2 &&
|
2021-01-17 01:30:45 +00:00
|
|
|
(if dy > 0
|
2021-01-19 11:50:15 +00:00
|
|
|
then abs dy > abs m1y2 + abs m2y1
|
|
|
|
else abs dy > abs m1y1 + abs m2y2
|
2021-01-17 01:30:45 +00:00
|
|
|
)
|
|
|
|
then 0
|
2021-01-19 11:50:15 +00:00
|
|
|
else (abs m1x1 + abs m2x2) - abs dx
|
2021-01-17 01:30:45 +00:00
|
|
|
else
|
2021-01-19 11:50:15 +00:00
|
|
|
if abs dx > abs m1x2 + abs m2x1 &&
|
2021-01-17 01:30:45 +00:00
|
|
|
(if dy > 0
|
2021-01-19 11:50:15 +00:00
|
|
|
then abs dy > abs m1y2 + abs m2y1
|
|
|
|
else abs dy > abs m1y1 + abs m2y2
|
2021-01-17 01:30:45 +00:00
|
|
|
)
|
|
|
|
then 0
|
2021-01-19 11:50:15 +00:00
|
|
|
else -((abs m1x2 + abs m2x1) - abs dx)
|
|
|
|
by = if dy < 0
|
2021-01-17 19:29:27 +00:00
|
|
|
then
|
2021-01-19 11:50:15 +00:00
|
|
|
if abs dy > abs m1y1 + abs m2y2 &&
|
2021-01-17 01:30:45 +00:00
|
|
|
(if dx > 0
|
2021-01-19 11:50:15 +00:00
|
|
|
then abs dx > abs m1x2 + abs m2x1
|
|
|
|
else abs dx > abs m1x1 + abs m2x2
|
2021-01-17 01:30:45 +00:00
|
|
|
)
|
|
|
|
then 0
|
2021-01-19 11:50:15 +00:00
|
|
|
else (abs m1y1 + abs m2y2) - abs dy
|
2021-01-17 01:30:45 +00:00
|
|
|
else
|
2021-01-19 11:50:15 +00:00
|
|
|
if abs dy > abs m1y2 + abs m2y1 &&
|
2021-01-17 01:30:45 +00:00
|
|
|
(if dx > 0
|
2021-01-19 11:50:15 +00:00
|
|
|
then abs dx > abs m1x2 + abs m2x1
|
|
|
|
else abs dx > abs m1x1 + abs m2x2
|
2021-01-17 01:30:45 +00:00
|
|
|
)
|
|
|
|
then 0
|
2021-01-19 11:50:15 +00:00
|
|
|
else -((abs m1y2 + abs m2y1) - abs dy)
|
2021-01-14 22:08:24 +00:00
|
|
|
in
|
2021-04-16 16:46:01 +00:00
|
|
|
(velocityUpdater mo1
|
|
|
|
-- ((positionUpdater mo1)
|
|
|
|
-- (p1 + ((ddt *) <$> v1)
|
|
|
|
-- -- if ddt == 0
|
|
|
|
-- -- then
|
|
|
|
-- -- if abs bx < abs by
|
|
|
|
-- -- then
|
|
|
|
-- -- V2 bx 0
|
|
|
|
-- -- else
|
|
|
|
-- -- V2 0 by
|
|
|
|
-- -- else
|
|
|
|
-- -- V2 0 0
|
|
|
|
-- )
|
|
|
|
-- )
|
2021-01-17 01:30:45 +00:00
|
|
|
) nvel
|