Processing math: 100%
ac-library-hs-1.2.3.0: Data structures and algorithms
Safe HaskellSafe-Inferred
LanguageGHC2021

AtCoder.Extra.DynSparseSegTree

Description

A dynamic, sparse segment tree that covers a half-open interval [l0,r0). Nodes are instantinated as needed, with the required capacity being q, where q is the number of mutable operations. The traid-off compared to the non-sparse variant is that initial monoid values are fixed at mempty.

Example

Expand
>>> import AtCoder.Extra.DynSparseSegTree qualified as Seg
>>> import Data.Semigroup (Sum (..))
>>> import Data.Vector.Unboxed qualified as VU

Create a DynSegTree over [0,4) with some initial capacity:

>>> let capacityFor len q = q * max 2 (2 + ceiling (logBase 2 (fromIntegral len) :: Double))
>>> let len = 4; q = 2
>>> seg <- Seg.new @_ @(Sum Int) (capacityFor len q) 0 4

Different from the SegTree module, it requires explicit root handle:

>>> -- [0, 0, 0, 0]
>>> root <- Seg.newRoot seg
>>> Seg.write seg root 1 $ Sum 10
>>> Seg.write seg root 2 $ Sum 20
>>> -- [0, 10, 20, 0]
>>> Seg.prod seg root 0 3
Sum {getSum = 30}
>>> Seg.maxRight seg root (< (Sum 30))
2

Since: 1.2.1.0

Synopsis

Dynamic, sparse segment tree

data DynSparseSegTree s a Source #

A dynamic, sparse segment tree that covers a half-open interval [l0,r0). Is is dynamic in that the nodes are instantinated as needed.

Since: 1.2.1.0

Constructors

DynSparseSegTree 

Fields

  • capacityDsst :: !Int

    The maximum number of nodes allocated

    Since: 1.2.1.0

  • isPersistentDsst :: !Bool

    Whether the data is persistent or not

    Since: 1.2.1.0

  • l0Dsst :: !Int

    Left index boundary (inclusive)

    Since: 1.2.1.0

  • r0Dsst :: !Int

    Right index boundary (exclusive)

    Since: 1.2.1.0

  • poolDsst :: !(Pool s ())

    Pool for free slot management.

    Since: 1.2.1.0

  • lDsst :: !(MVector s Index)

    Decomposed node storage: left children

    Since: 1.2.1.0

  • rDsst :: !(MVector s Index)

    Decomposed node storage: right children

    Since: 1.2.1.0

  • xDsst :: !(MVector s a)

    Decomposed node storage: position

    Since: 1.2.1.0

  • iDsst :: !(MVector s Int)

    Decomposed node storage: position

    Since: 1.2.1.0

  • prodDsst :: !(MVector s a)

    Decomposed node storage: monoid product

    Since: 1.2.1.0

Re-exports

newtype Handle s Source #

Mutable Handle of an Index.

Since: 1.2.0.0

Constructors

Handle 

Fields

Constructors

new Source #

Arguments

:: (HasCallStack, PrimMonad m, Monoid a, Unbox a) 
=> Int

Capacity n

-> Int

Left index boundary l0

-> Int

Right index boundary r0

-> m (DynSparseSegTree (PrimState m) a)

Dynamic, sparse segment tree

O(n) Creates a DynSparseSegTree of capacity n for interval [l0,r0) with mempty as initial leaf values.

Since: 1.2.1.0

recommendedCapacity :: Int -> Int -> Int Source #

O(1) Returns recommended capacity for L and q: q.

Since: 1.2.1.0

newRoot :: (HasCallStack, PrimMonad m, Monoid a, Unbox a) => DynSparseSegTree (PrimState m) a -> m (Handle (PrimState m)) Source #

O(1) Creates a new root in [l0,r0).

Since: 1.2.1.0

Accessing elements

write :: (HasCallStack, PrimMonad m, Monoid a, Unbox a) => DynSparseSegTree (PrimState m) a -> Handle (PrimState m) -> Int -> a -> m () Source #

O(logL) Writes to the monoid value of the node at i.

Constraints

  • l0i<r0

Since: 1.2.1.0

modify :: (HasCallStack, PrimMonad m, Monoid a, Unbox a) => DynSparseSegTree (PrimState m) a -> Handle (PrimState m) -> (a -> a) -> Int -> m () Source #

O(logL) Modifies the monoid value of the node at i.

Constraints

  • l0i<r0

Since: 1.2.1.0

modifyM :: (HasCallStack, PrimMonad m, Monoid a, Unbox a) => DynSparseSegTree (PrimState m) a -> Handle (PrimState m) -> (a -> m a) -> Int -> m () Source #

O(logL) Modifies the monoid value of the node at i.

Constraints

  • l0i<r0

Since: 1.2.1.0

Products

prod :: (HasCallStack, PrimMonad m, Monoid a, Unbox a) => DynSparseSegTree (PrimState m) a -> Handle (PrimState m) -> Int -> Int -> m a Source #

O(logL) Returns the monoid product in [l,r).

Constraints

  • l0lrr0

Since: 1.2.1.0

allProd :: (HasCallStack, PrimMonad m, Monoid a, Unbox a) => DynSparseSegTree (PrimState m) a -> Handle (PrimState m) -> m a Source #

O(logL) Returns the monoid product in [l0,r0).

Since: 1.2.1.0

Binary searches

maxRight :: (HasCallStack, PrimMonad m, Monoid a, Unbox a) => DynSparseSegTree (PrimState m) a -> Handle (PrimState m) -> (a -> Bool) -> m Int Source #

O(logL) Returns the maximum r[l0,r0) where f(al0al0+1ar1) holds.

Since: 1.2.1.0

maxRightM :: (HasCallStack, PrimMonad m, Monoid a, Unbox a) => DynSparseSegTree (PrimState m) a -> Handle (PrimState m) -> (a -> m Bool) -> m Int Source #

O(logL) Returns the maximum r[l0,r0) where f(al0al0+1ar1) holds.

Since: 1.2.1.0

Clear

clear :: PrimMonad m => DynSparseSegTree (PrimState m) a -> m () Source #

O(logL) Claers all the nodes from the storage.

Since: 1.2.2.0