►Njuce | |
►NAiffFileHelpers | |
►CInstChunk | |
CLoop | |
CBASCChunk | |
►Ndsp | |
►NFIR | Classes for FIR filter processing |
CCoefficients | A set of coefficients for use in an FIRFilter object |
CFilter | A processing class that can perform FIR filtering on an audio signal, in the time domain |
►NIIR | Classes for IIR filter processing |
CCoefficients | A set of coefficients for use in an Filter object |
CFilter | A processing class that can perform IIR filtering on an audio signal, using the Transposed Direct Form II digital structure |
►NSIMDInternal | A template specialisation to find corresponding mask type for primitives |
CMaskTypeFor | |
CMaskTypeFor< float > | |
CMaskTypeFor< double > | |
CMaskTypeFor< char > | |
CMaskTypeFor< int8_t > | |
CMaskTypeFor< int16_t > | |
CMaskTypeFor< int32_t > | |
CMaskTypeFor< int64_t > | |
CMaskTypeFor< std::complex< float > > | |
CMaskTypeFor< std::complex< double > > | |
CPrimitiveType | |
CPrimitiveType< std::complex< Primitive > > | |
CLog2Helper | |
CLog2Helper< 1 > | |
►NSIMDRegister_test_internal | |
CRandomPrimitive | |
CRandomPrimitive< type, typename std::enable_if< std::is_floating_point< type >::value >::type > | |
CRandomPrimitive< type, typename std::enable_if< std::is_integral< type >::value >::type > | |
CRandomValue | |
CRandomValue< std::complex< type > > | |
CVecFiller | |
CVecFiller< std::complex< type > > | |
CVecFiller< SIMDRegister< type > > | |
►NStateVariableFilter | Classes for state variable filter processing |
CParameters | Structure used for the state variable filter parameters |
CFilter | An IIR filter that can perform low, band and high-pass filtering on an audio signal, with 12 dB of attenuation / octave, using a TPT structure, designed for fast modulation (see Vadim Zavalishin's documentation about TPT structures for more information) |
CAudioBlock | Minimal and lightweight data-structure which contains a list of pointers to channels containing some kind of sample data |
CAudioBlockUnitTests | |
►CSIMDRegister | A wrapper around the platform's native SIMD register type |
CElementAccess | |
►CSIMDRegisterUnitTests | |
CAccessTest | |
CAddition | |
CBitAND | |
CBitOperatorTests | |
CBitOR | |
CBitXOR | |
CCheckAbs | |
CCheckBoolEquals | |
CCheckComparisonOps | |
CCheckMinMax | |
CCheckMultiplyAdd | |
CCheckSum | |
CCheckTruncate | |
CInitializationTest | |
CMultiplication | |
COperatorTests | |
CSubtraction | |
►CFilterDesign | This class provides a set of functions which generates FIR::Coefficients and IIR::Coefficients, of high-order low-pass filters |
CIIRPolyphaseAllpassStructure | The structure returned by the function designIIRLowpassHalfBandPolyphaseAllpassMethod |
►CConvolutionEngine | This class is the convolution engine itself, processing only one channel at a time of input signal |
CProcessingInformation | |
►CConvolution | Performs stereo uniform-partitioned convolution of an input signal with an impulse response in the frequency domain, using the juce FFT class |
CPimpl | Manages all the changes requested by the main convolution engine, to minimize the number of calls of the convolution engine initialization, and the potential consequences of multiple quick calls to the function Convolution::loadImpulseResponse |
►CFFTFallback | |
►CFFTConfig | |
CFactor | |
►CFFT | Performs a fast fourier transform |
CEngine | |
CEngineImpl | |
CInstance | |
►CFFTUnitTest | |
CComplexTest | |
CFrequencyOnlyTest | |
CRealTest | |
CWindowingFunction | A class which provides multiple windowing functions useful for filter design and spectrum analyzers |
CFastMathApproximations | This class contains various fast mathematical function approximations |
CLogRampedValue | Utility class for logarithmically smoothed linear values |
CLogRampedValueTests | |
CLookupTable | Class for efficiently approximating expensive arithmetic operations |
CLookupTableTransform | Class for approximating expensive arithmetic operations |
CMatrix | General matrix and vectors class, meant for classic math manipulation such as additions, multiplications, and linear systems of equations solving |
►CLinearAlgebraUnitTest | |
CAdditionTest | |
CDifferenceTest | |
CHadamardProductTest | |
CIdentityMatrixTest | |
CMultiplicationTest | |
CScalarMultiplicationTest | |
CSolvingTest | |
CPhase | Represents an increasing phase value between 0 and 2*pi |
CPolynomial | A class representing a polynomial |
CSpecialFunctions | Contains miscellaneous filter design and windowing functions |
►CSIMDFallbackOps | Useful fallback routines to use if the native SIMD op is not supported |
CScalarAdd | |
CScalarAnd | |
CScalarEq | |
CScalarGeq | |
CScalarGt | |
CScalarMax | |
CScalarMin | |
CScalarMul | |
CScalarNeq | |
CScalarNot | |
CScalarOr | |
CScalarSub | |
CScalarXor | |
CUnionMaskType | |
CUnionType | |
CBias | Adds a DC offset (voltage bias) to the audio samples |
CFIRFilterTest | |
CGain | Applies a gain to audio samples as single samples or AudioBlocks |
CLadderFilter | Multi-mode filter based on the Moog ladder filter |
COscillator | Generates a signal based on a user-supplied function |
COversamplingDummy | Dummy oversampling stage class which simply copies and pastes the input signal, which could be equivalent to a "one time" oversampling processing |
COversampling2TimesEquirippleFIR | Oversampling stage class performing 2 times oversampling using the Filter Design FIR Equiripple method |
COversampling2TimesPolyphaseIIR | Oversampling stage class performing 2 times oversampling using the Filter Design IIR Polyphase Allpass Cascaded method |
►COversampling | A processing class performing multi-channel oversampling |
COversamplingStage | Abstract class for the provided oversampling stages used internally in the Oversampling class |
CProcessSpec | This structure is passed into a DSP algorithm's prepare() method, and contains information about various aspects of the context in which it can expect to be called |
CProcessorState | This is a handy base class for the state of a processor (such as parameter values) which is typically shared among several processors |
CProcessContextReplacing | Contains context information that is passed into an algorithm's process method |
CProcessContextNonReplacing | Contains context information that is passed into an algorithm's process method |
CProcessorDuplicator | Converts a mono processor class into a multi-channel version by duplicating it and applying multichannel buffers across an array of instances |
CProcessorBase | Acts as a polymorphic base class for processors |
CProcessorWrapper | Wraps an instance of a given processor class, and exposes it through the ProcessorBase interface |
CReverb | Processor wrapper around juce::Reverb for easy integration into ProcessorChain |
CWaveShaper | Applies waveshaping to audio samples as single samples or AudioBlocks |
►NFloatVectorHelpers | |
CsignMask32 | |
CsignMask64 | |
►NNumberToStringConverters | |
CStackArrayStream | |
►NTypeHelpers | This namespace contains a few template classes for helping work out class type variations |
CParameterType | The ParameterType struct is used to find the best type to use when passing some kind of object as a parameter |
CSmallestFloatType | These templates are designed to take a type, and if it's a double, they return a double type; for anything else, they return a float type |
CUnsignedTypeWithSize | These templates are designed to take an integer type, and return an unsigned int version with the same size |
►NValueSmoothingTypes | A namespace containing a set of types used for specifying the smoothing behaviour of the SmoothedValue class |
CLinear | Used to indicate a linear smoothing between values |
CMultiplicative | Used to indicate a smoothing between multiplicative values |
►NWavFileHelpers | |
CBWAVChunk | |
►CSMPLChunk | |
CSampleLoop | |
CInstChunk | |
►CCueChunk | |
CCue | |
CAcidChunk | |
CTracktionChunk | |
CExtensibleWavSubFormat | |
CDataSize64Chunk | |
►NWindowsMediaCodec | |
CJuceIStream | |
CWMAudioReader | |
►NXmlOutputFunctions | |
►NLegalCharLookupTable | |
CBit | |
CByte | |
►CAudioPlayHead | A subclass of AudioPlayHead can supply information about the position and status of a moving play head during audio playback |
CCurrentPositionInfo | This structure is filled-in by the AudioPlayHead::getCurrentPosition() method |
CAudioChannelSet | Represents a set of audio channel types |
►CAudioData | This class a container which holds all the classes pertaining to the AudioData::Pointer audio sample format class |
CConverter | A base class for objects that are used to convert between two different sample formats |
CConverterInstance | A class that converts between two templated AudioData::Pointer types, and which implements the AudioData::Converter interface |
CPointer | Used as a template parameter for AudioData::Pointer |
CAudioDataConverters | A set of routines to convert buffers of 32-bit floating point data to and from various integer formats |
►CAudioProcessLoadMeasurer | Maintains an ongoing measurement of the proportion of time which is being spent inside an audio callback |
CScopedTimer | This class measures the time between its construction and destruction and adds it to an AudioProcessLoadMeasurer |
CAudioBuffer | A multi-channel buffer containing floating point audio samples |
CFloatVectorOperations | A collection of simple vector operations on arrays of floats, accelerated with SIMD instructions where possible |
CScopedNoDenormals | Helper class providing an RAII-based mechanism for temporarily disabling denormals on your CPU |
►CMidiBuffer | Holds a sequence of time-stamped midi events |
CIterator | Used to iterate through the events in a MidiBuffer |
CMidiFile | Reads/writes standard midi format files |
CMidiKeyboardStateListener | Receives events from a MidiKeyboardState object |
CMidiKeyboardState | Represents a piano keyboard, keeping track of which keys are currently pressed |
CMidiMessage | Encapsulates a MIDI message |
►CMidiMessageSequence | A sequence of timestamped midi messages |
CMidiEventHolder | Structure used to hold midi events in the sequence |
CMidiRPNMessage | Represents a MIDI RPN (registered parameter number) or NRPN (non-registered parameter number) message |
CMidiRPNDetector | Parses a stream of MIDI data to assemble RPN and NRPN messages from their constituent MIDI CC messages |
CMidiRPNGenerator | Generates an appropriate sequence of MIDI CC messages to represent an RPN or NRPN message |
►CMPEInstrument | This class represents an instrument handling MPE |
CListener | Derive from this class to be informed about any changes in the expressive MIDI notes played by this instrument |
CMPEMessages | This helper class contains the necessary helper functions to generate MIDI messages that are exclusive to MPE, such as defining the upper and lower MPE zones and setting per-note and master pitchbend ranges |
CMPENote | This struct represents a playing MPE note |
CMPESynthesiser | Base class for an MPE-compatible musical device that can play sounds |
CMPESynthesiserBase | Derive from this class to create a basic audio generator capable of MPE |
CMPESynthesiserVoice | Represents an MPE voice that an MPESynthesiser can use to play a sound |
CMPEChannelAssigner | This class handles the assignment of new MIDI notes to member channels of an active MPE zone |
CMPEChannelRemapper | This class handles the logic for remapping MIDI note messages from multiple MPE sources onto a specified MPE zone |
CMPEValue | This class represents a single value for any of the MPE dimensions of control |
►CMPEZoneLayout | This class represents the current MPE zone layout of a device capable of handling MPE |
CListener | Listener class |
CZone | This struct represents an MPE zone |
CAudioSourceChannelInfo | Used by AudioSource::getNextAudioBlock() |
CAudioSource | Base class for objects that can produce a continuous stream of audio |
CBufferingAudioSource | An AudioSource which takes another source as input, and buffers it using a thread |
CChannelRemappingAudioSource | An AudioSource that takes the audio from another source, and re-maps its input and output channels to a different arrangement |
CIIRFilterAudioSource | An AudioSource that performs an IIR filter on another source |
CMemoryAudioSource | An AudioSource which takes some float audio data as an input |
CMixerAudioSource | An AudioSource that mixes together the output of a set of other AudioSources |
CPositionableAudioSource | A type of AudioSource which can be repositioned |
CResamplingAudioSource | A type of AudioSource that takes an input source and changes its sample rate |
CReverbAudioSource | An AudioSource that uses the Reverb class to apply a reverb to another AudioSource |
CToneGeneratorAudioSource | A simple AudioSource that generates a sine wave |
CSynthesiserSound | Describes one of the sounds that a Synthesiser can play |
CSynthesiserVoice | Represents a voice that a Synthesiser can use to play a SynthesiserSound |
CSynthesiser | Base class for a musical device that can play sounds |
►CADSR | A very simple ADSR envelope class |
CParameters | Holds the parameters being used by an ADSR object |
CCatmullRomAlgorithm | |
CCatmullRomInterpolator | Interpolator for resampling a stream of floats using Catmull-Rom interpolation |
CDecibels | This class contains some helpful static methods for dealing with decibel values |
CIIRCoefficients | A set of coefficients for use in an IIRFilter object |
CIIRFilter | An IIR filter that can perform low, high, or band-pass filtering on an audio signal |
CLagrangeResampleHelper | |
CLagrangeResampleHelper< 0 > | |
CLagrangeAlgorithm | |
CLagrangeInterpolator | Interpolator for resampling a stream of floats using 4-point lagrange interpolation |
►CReverb | Performs a simple reverb effect on a stream of audio data |
CParameters | Holds the parameters being used by a Reverb object |
CSmoothedValueBase | A base class for the smoothed value classes |
CSmoothedValue | A utility class for values that need smoothing to avoid audio glitches |
►CAudioDeviceManager | Manages the state of some audio and midi i/o devices |
CAudioDeviceSetup | This structure holds a set of properties describing the current audio setup |
CCallbackHandler | |
CLevelMeter | A simple reference-counted struct that holds a level-meter value that can be read using getCurrentLevel() |
CAudioIODeviceCallback | One of these is passed to an AudioIODevice object to stream the audio data in and out |
CAudioIODevice | Base class for an audio device with synchronised input and output channels |
►CAudioIODeviceType | Represents a type of audio driver, such as DirectSound, ASIO, CoreAudio, etc |
CListener | A class for receiving events when audio devices are inserted or removed |
CSystemAudioVolume | Contains functions to control the system's master volume |
CMidiDeviceInfo | This struct contains information about a MIDI input or output device |
CMidiInput | Represents a midi input device |
CMidiInputCallback | Receives incoming messages from a physical MIDI input device |
CMidiOutput | Represents a midi output device |
CMidiMessageCollector | Collects incoming realtime MIDI messages and turns them into blocks suitable for processing by a block-based audio callback |
CAudioSourcePlayer | Wrapper class to continuously stream audio from an audio source to an AudioIODevice |
CAudioTransportSource | An AudioSource that takes a PositionableAudioSource and allows it to be played, stopped, started, etc |
CAiffAudioFormatReader | |
CAiffAudioFormatWriter | |
CMemoryMappedAiffReader | |
CAiffAudioFormat | Reads and Writes AIFF format audio files |
►CCoreAudioFormatMetatdata | |
CAudioDescriptionChunk | |
CChunkHeader | |
CFileHeader | |
CCoreAudioReader | |
CCoreAudioFormat | OSX and iOS only - This uses the AudioToolbox framework to read any audio format that the system has a codec for |
CFlacAudioFormat | Reads and writes the lossless-compression FLAC audio format |
CLAMEEncoderAudioFormat | An AudioFormat class which can use an installed version of the LAME mp3 encoder to encode a file |
CMP3AudioFormat | Software-based MP3 decoding format (doesn't currently provide an encoder) |
COggVorbisAudioFormat | Reads and writes the Ogg-Vorbis audio format |
CWavAudioFormatReader | |
CWavAudioFormatWriter | |
CMemoryMappedWavReader | |
CWavAudioFormat | Reads and Writes WAV format audio files |
CWindowsMediaAudioFormat | Audio format which uses the Windows Media codecs (Windows only) |
CAudioFormat | Subclasses of AudioFormat are used to read and write different audio file formats |
CAudioFormatManager | A class for keeping a list of available audio formats, and for deciding which one to use to open a given file |
►CAudioFormatReader | Reads samples from an audio file stream |
CReadHelper | Used by AudioFormatReader subclasses to copy data to different formats |
CAudioFormatReaderSource | A type of AudioSource that will read from an AudioFormatReader |
►CAudioFormatWriter | Writes samples to an audio file stream |
►CThreadedWriter | Provides a FIFO for an AudioFormatWriter, allowing you to push incoming data into a buffer which will be flushed to disk by a background thread |
CBuffer | |
CIncomingDataReceiver | Receiver for incoming data |
CWriteHelper | Used by AudioFormatWriter subclasses to copy data to different formats |
CAudioSubsectionReader | This class is used to wrap an AudioFormatReader and only read from a subsection of the file |
CBufferingAudioReader | An AudioFormatReader that uses a background thread to pre-read data from another reader |
CMemoryMappedAudioFormatReader | A specialised type of AudioFormatReader that uses a MemoryMappedFile to read directly from an audio file |
CSamplerSound | A subclass of SynthesiserSound that represents a sampled audio clip |
CSamplerVoice | A subclass of SynthesiserVoice that can play a SamplerSound |
►CAbstractFifo | Encapsulates the logic required to implement a lock-free FIFO |
CScopedReadWrite | Class for a scoped reader/writer |
CArray | Holds a resizable array of primitive or copy-by-value objects |
CArrayAllocationBase | Implements some basic array storage allocation functions |
CArrayBase | A basic object container |
CDynamicObject | Represents a dynamically implemented object |
CDefaultElementComparator | A simple ElementComparator class that can be used to sort an array of objects that support the '<' operator |
CDefaultHashFunctions | A simple class to generate hash functions for some primitive types, intended for use with the HashMap class |
►CHashMap | Holds a set of mappings between some key/value pairs |
CIterator | Iterates over the items in a HashMap |
►CHashMapTest | |
CAccessTest | |
CAddElementsTest | |
►CAssociativeMap | |
CKeyValuePair | |
►CPersistantMemoryLocationOfValues | |
CAddressAndValue | |
CRandomKeys | |
CRemoveTest | |
►CLinkedListPointer | Helps to manipulate singly-linked lists of objects |
CAppender | Allows efficient repeated insertions into a list |
►CListenerList | Holds a set of objects and can invoke a member function callback on each object in the set with a single call |
CDummyBailOutChecker | A dummy bail-out checker that always returns false |
CIterator | Iterates the listeners in a ListenerList |
►CNamedValueSet | Holds a set of named var objects |
CNamedValue | Structure for a named var object |
COwnedArray | An array designed for holding objects |
CPropertySet | A set of named property values, which can be strings, integers, floating point, etc |
CReferenceCountedArray | Holds a list of objects derived from ReferenceCountedObject, or which implement basic reference-count handling methods |
CScopedValueSetter | Helper class providing an RAII-based mechanism for temporarily setting and then re-setting a value |
CSortedSet | Holds a set of unique primitive objects, such as ints or doubles |
CSparseSet | Holds a set of primitive values, storing them as a set of ranges |
►Cvar | A variant class, that can be used to hold a range of primitive values |
CNativeFunctionArgs | This structure is passed to a NativeFunction callback, and contains invocation details about the function's arguments and context |
CVariantType | |
►CVariantType_Array | |
CRefCountedArray | |
CVariantType_Binary | |
CVariantType_Bool | |
CVariantType_Double | |
CVariantType_Int | |
CVariantType_Int64 | |
CVariantType_Method | |
CVariantType_Object | |
CVariantType_String | |
CVariantType_Undefined | |
CVariantType_Void | |
CVariantConverter | This template-overloaded class can be used to convert between var and custom types |
CDirectoryIterator | Searches through the files in a directory, returning each file that is found |
►CFile | Represents a local file or directory |
CNaturalFileComparator | Comparator for files |
CFileFilter | Interface for deciding which files are suitable for something |
CFileInputStream | An input stream that reads from a local file |
CFileOutputStream | An output stream that writes into a local file |
CFileSearchPath | Represents a set of folders that make up a search path |
CMemoryMappedFile | Maps a file into virtual memory for easy reading and/or writing |
CTemporaryFile | Manages a temporary file, which will be deleted when this object is deleted |
CWildcardFileFilter | A type of FileFilter that works by wildcard pattern matching |
►CJavascriptEngine | A simple javascript interpreter! |
►CRootObject | |
CAdditionOp | |
CArrayClass | |
CArrayDeclaration | |
CArraySubscript | |
CAssignment | |
CBinaryOperator | |
CBinaryOperatorBase | |
CBitwiseAndOp | |
CBitwiseOrOp | |
CBitwiseXorOp | |
CBlockStatement | |
CBreakStatement | |
CCodeLocation | |
CConditionalOp | |
CContinueStatement | |
CDivideOp | |
CDotOperator | |
CEqualsOp | |
CExpression | |
CExpressionTreeBuilder | |
CFunctionCall | |
CFunctionObject | |
CGreaterThanOp | |
CGreaterThanOrEqualOp | |
CIfStatement | |
CIntegerClass | |
CJSONClass | |
CLeftShiftOp | |
CLessThanOp | |
CLessThanOrEqualOp | |
CLiteralValue | |
CLogicalAndOp | |
CLogicalOrOp | |
CLoopStatement | |
CMathClass | |
CModuloOp | |
CMultiplyOp | |
CNewOperator | |
CNotEqualsOp | |
CObjectClass | |
CObjectDeclaration | |
CPostAssignment | |
CReturnStatement | |
CRightShiftOp | |
CRightShiftUnsignedOp | |
CScope | |
CSelfAssignment | |
CStatement | |
CStringClass | |
CSubtractionOp | |
CTokenIterator | |
CTypeEqualsOp | |
CTypeNotEqualsOp | |
CUnqualifiedName | |
CVarStatement | |
►CJSONParser | |
CErrorException | |
CJSONFormatter | |
CJSON | Contains static methods for converting JSON-formatted text to and from var objects |
CFileLogger | A simple implementation of a Logger that writes to a file |
CLogger | Acts as an application-wide logging class |
CBigInteger | An arbitrarily large integer class |
►CExpression | A class for dynamically evaluating simple numeric expressions |
►CHelpers | |
CAdd | |
CBinaryTerm | |
CConstant | |
CDivide | |
CDotOperator | |
CEvaluationError | An exception that can be thrown by Expression::evaluate() |
CFunction | |
CMultiply | |
CNegate | |
CParser | |
CSubtract | |
CSymbolCheckVisitor | |
CSymbolListVisitor | |
CSymbolTerm | |
►CScope | When evaluating an Expression object, this class is used to resolve symbols and perform functions that the expression uses |
CVisitor | Used as a callback by the Scope::visitRelativeScope() method |
CSymbol | Represents a symbol that is used in an Expression |
►CTerm | |
CSymbolVisitor | |
CMathConstants | Commonly used mathematical constants |
CNormalisableRange | Represents a mapping between an arbitrary range of values and a normalised 0->1 range |
CRandom | A random number generator |
CRange | A general-purpose range object, that simply represents any linear range with a start and end point |
CStatisticsAccumulator | A class that measures various statistics about a series of floating point values that it is given |
CAtomic | A simple wrapper around std::atomic |
CByteOrder | Contains static methods for converting the byte order between different endiannesses |
CContainerDeletePolicy | Used by container classes as an indirect way to delete an object of a particular type |
CHeapBlock | Very simple container class to hold a pointer to some data on the heap |
CHeavyweightLeakedObjectDetector | This class is a useful way of tracking down hard to find memory leaks when the regular LeakedObjectDetector isn't enough |
CLeakedObjectDetector | Embedding an instance of this class inside another class can be used as a low-overhead way of detecting leaked instances |
CScopedAutoReleasePool | A handy C++ wrapper that creates and deletes an NSAutoreleasePool object using RAII |
CMemoryBlock | A class to hold a resizable block of raw data |
COptionalScopedPointer | Holds a pointer to an object which can optionally be deleted when this pointer goes out of scope |
CReferenceCountedObject | A base class which provides methods for reference-counting |
CSingleThreadedReferenceCountedObject | Adds reference-counting to an object |
CReferenceCountedObjectPtr | A smart-pointer class which points to a reference-counted object |
CSharedResourcePointer | A smart-pointer that automatically creates and manages the lifetime of a shared static instance of a class |
CSingletonHolder | Used by the JUCE_DECLARE_SINGLETON macros to manage a static pointer to a singleton instance |
►CWeakReference | This class acts as a pointer which will automatically become null if the object to which it points is deleted |
CMaster | This class is embedded inside an object to which you want to attach WeakReference pointers |
CSharedPointer | This class is used internally by the WeakReference class - don't use it directly in your code! |
CConsoleAppFailureCode | |
►CArgumentList | Holds a list of command-line arguments, and provides useful methods for searching and operating on them |
CArgument | One of the arguments in an ArgumentList |
►CConsoleApplication | Represents a the set of commands that a console app can perform, and provides helper functions for performing them |
CCommand | Represents a command that can be executed if its command-line arguments are matched |
CResult | Represents the 'success' or 'failure' of an operation, and holds an associated error message to describe the error when there's a failure |
CRuntimePermissions | |
CUuid | A universally unique 128-bit identifier |
CWindowsRegistry | Contains some static helper functions for manipulating the MS Windows registry (Only available on Windows, of course!) |
CIPAddressByteUnion | Union used to split a 16-bit unsigned integer into 2 8-bit unsigned integers or vice-versa |
CIPAddress | Represents an IP address |
CMACAddress | Represents a MAC network card adapter address ID |
CNamedPipe | A cross-process pipe that can have data written to and read from it |
CStreamingSocket | A wrapper for a streaming (TCP) socket |
CDatagramSocket | A wrapper for a datagram (UDP) socket |
CFallbackDownloadTask | |
CiOSFileStreamWrapperFlush | |
CiOSFileStreamWrapperFlush< FileOutputStream > | |
CiOSFileStreamWrapper | |
►CURL | Represents a URL and has a bunch of useful functions to manipulate it |
►CDownloadTask | Represents a download task |
CListener | Used to receive callbacks for download progress |
►CWebInputStream | An InputStream which can be used to read from a given url |
CListener | Used to receive callbacks for data send progress |
CBufferedInputStream | Wraps another input stream, and reads from it using an intermediate buffer |
CFileInputSource | A type of InputSource that represents a normal file |
CInputSource | A lightweight object that can create a stream to read some kind of resource |
CInputStream | The base class for streams that read data |
CMemoryInputStream | Allows a block of data to be accessed as a stream |
CMemoryOutputStream | Writes data to an internal memory buffer, which grows as required |
COutputStream | The base class for streams that write data to some kind of destination |
CSubregionStream | Wraps another input stream, and reads from a specific part of it |
CURLInputSource | A type of InputSource that represents a URL |
CCPUInformation | |
CSystemStats | Contains methods for finding out about the current hardware and OS configuration |
CBase64 | Contains some static methods for converting between binary and the standard base-64 encoding format |
►CCharacterFunctions | A collection of functions for manipulating characters and character strings |
CHexParser | Parses a character string, to read a hexadecimal value |
CCharPointer_ASCII | Wraps a pointer to a null-terminated ASCII character string, and provides various methods to operate on the data |
CCharPointer_UTF16 | Wraps a pointer to a null-terminated UTF-16 character string, and provides various methods to operate on the data |
CCharPointer_UTF32 | Wraps a pointer to a null-terminated UTF-32 character string, and provides various methods to operate on the data |
CCharPointer_UTF8 | Wraps a pointer to a null-terminated UTF-8 character string, and provides various methods to operate on the data |
CIdentifier | Represents a string identifier, designed for accessing properties by name |
CLocalisedStrings | Used to convert strings to localised foreign-language versions |
CNewLine | This class is used for represent a new-line character sequence |
CEmptyString | |
CStringHolder | |
CHashGenerator | |
CWildCardMatcher | |
CStringCreationHelper | |
CStringEncodingConverter | |
CStringEncodingConverter< CharPointer_UTF8, CharPointer_UTF8 > | |
CStringEncodingConverter< CharPointer_UTF16, CharPointer_UTF16 > | |
CStringEncodingConverter< CharPointer_UTF32, CharPointer_UTF32 > | |
CStringCopier | |
CString | The JUCE String class! |
CStringArray | A special array for holding a list of strings |
CStringPairArray | A container for holding a set of strings which are keyed by another string |
CStartEndString | |
CStringPool | A StringPool holds a set of shared strings, which reduces storage overheads and improves comparison speed when dealing with many duplicate strings |
CStringRef | A simple class for holding temporary references to a string literal or String |
►CTextDiffHelpers | |
CStringRegion | |
►CTextDiff | Calculates and applies a sequence of changes to convert one text string into another |
CChange | Describes a change, which can be either an insertion or deletion |
CChildProcess | Launches and monitors a child process |
CCriticalSection | A re-entrant mutex |
►CDummyCriticalSection | A class that can be used in place of a real CriticalSection object, but which doesn't perform any locking |
CScopedLockType | A dummy scoped-lock type to use with a dummy critical section |
CDynamicLibrary | Handles the opening and closing of DLLs |
CHighResolutionTimer | A high-resolution periodic timer |
►CInterProcessLock | Acts as a critical section which processes can use to block each other |
CScopedLockType | Automatically locks and unlocks an InterProcessLock object |
CProcess | Represents the current executable's process |
CReadWriteLock | A critical section that allows multiple simultaneous readers |
CGenericScopedLock | Automatically locks and unlocks a mutex object |
CGenericScopedUnlock | Automatically unlocks and re-locks a mutex object |
CGenericScopedTryLock | Automatically locks and unlocks a mutex object |
CScopedReadLock | Automatically locks and unlocks a ReadWriteLock object |
CScopedWriteLock | Automatically locks and unlocks a ReadWriteLock object |
CSpinLock | A simple spin-lock class that can be used as a simple, low-overhead mutex for uncontended situations |
CCurrentThreadHolder | |
CLambdaThread | |
►CThread | Encapsulates a thread |
CListener | Used to receive callbacks for thread exit calls |
CThreadLocalValue | Provides cross-platform support for thread-local objects |
CThreadPoolJob | A task that is executed by a ThreadPool object |
►CThreadPool | A set of threads that will run a list of jobs |
CJobSelector | A callback class used when you need to select which ThreadPoolJob objects are suitable for some kind of operation |
CThreadPoolThread | |
CTimeSliceClient | Used by the TimeSliceThread class |
CTimeSliceThread | A thread that keeps a list of clients, and calls each one in turn, giving them all a chance to run some sort of short task |
CWaitableEvent | Allows threads to wait for events triggered by other threads |
►CPerformanceCounter | A timer for measuring performance of code and dumping the results to a file |
CStatistics | Holds the current statistics |
CScopedTimeMeasurement | Simple RAII class for measuring the time spent in a scope |
CRelativeTime | A relative measure of time |
CTime | Holds an absolute date and time |
CUnitTest | This is a base class for classes that perform a unit test |
►CUnitTestRunner | Runs a set of unit tests |
CTestResult | Contains the results of a test |
CXmlDocument | Parses a text-based XML document and creates an XmlElement object from it |
►CXmlElement | Used to build a tree of elements representing an XML document |
CTextFormat | A struct containing options for formatting the text when representing an XML element as a string |
►CGZIPCompressorOutputStream | A stream which uses zlib to compress the data written into it |
CGZIPCompressorHelper | |
►CGZIPDecompressorInputStream | This stream will decompress a source-stream using zlib |
CGZIPDecompressHelper | |
►CZipFile | Decodes a ZIP file from a stream |
►CBuilder | Used to create a new zip file |
CItem | |
CZipEntry | Contains information about one of the entries in a ZipFile |
CZipEntryHolder | |
CZipInputStream | |
CApplicationProperties | Manages a collection of properties |
►CPropertiesFile | Wrapper on a file that stores a list of key/value data pairs |
COptions | Structure describing properties file options |
CUndoableAction | Used by the UndoManager class to store an action which can be done and undone |
►CUndoManager | Manages a list of undo/redo commands |
CActionSet | |
CCachedValue | This class acts as a typed wrapper around a property inside a ValueTree |
CSimpleValueSource | |
►CValue | Represents a shared variant value |
CListener | Receives callbacks when a Value object changes |
CValueSource | Used internally by the Value class as the base class for its shared value objects |
CValueTreePropertyValueSource | |
►CValueTree | A powerful tree structure that can be used to hold free-form data, and which can handle its own undo and redo behaviour |
CIterator | Iterator for a ValueTree |
CListener | Listener class for events that happen to a ValueTree |
►CSharedObject | |
CAddOrRemoveChildAction | |
CMoveChildAction | |
CSetPropertyAction | |
CValueTreeSynchroniser | This class can be used to watch for all changes to the state of a ValueTree, and to convert them to a transmittable binary encoding |
CValueWithDefault | This class acts as a wrapper around a property inside a ValueTree |
►CActionBroadcaster | Manages a list of ActionListeners, and can send them messages |
CActionMessage | |
CActionListener | Interface class for delivery of events that are sent by an ActionBroadcaster |
►CAsyncUpdater | Has a callback method that is triggered asynchronously |
CAsyncUpdaterMessage | |
CChangeBroadcaster | Holds a list of ChangeListeners, and sends messages to them when instructed |
CChangeListener | Receives change event callbacks that are sent out by a ChangeBroadcaster |
CChildProcessPingThread | |
►CChildProcessSlave | Acts as the slave end of a master/slave pair of connected processes |
CConnection | |
►CChildProcessMaster | Acts as the master in a master/slave pair of connected processes |
CConnection | |
CConnectionStateMessage | |
CDataDeliveryMessage | |
►CInterprocessConnection | Manages a simple two-way messaging connection to another process, using either a socket or a named pipe as the transport medium |
CConnectionThread | |
CInterprocessConnectionServer | An object that waits for client sockets to connect to a port on this host, and creates InterprocessConnection objects for each one |
►CNetworkServiceDiscovery | Contains classes that implement a simple protocol for broadcasting the availability and location of a discoverable service on the local network, and for maintaining a list of known services |
CAdvertiser | An object which runs a thread to repeatedly broadcast the existence of a discoverable service |
CAvailableServiceList | Watches the network for broadcasts from Advertiser objects, and keeps a list of all the currently active instances |
CService | Contains information about a service that has been found on the network |
►CJUCEApplicationBase | Abstract base class for application classes |
CMultipleInstanceHandler | |
CCallbackMessage | A message that invokes a callback method when it gets delivered |
CDeletedAtShutdown | Classes derived from this will be automatically deleted when the application exits |
CScopedJuceInitialiser_GUI | A utility object that helps you initialise and shutdown JUCE correctly using an RAII pattern |
CMessage | The base class for objects that can be sent to a MessageListener |
CMessageListener | MessageListener subclasses can post and receive Message objects |
CAsyncFunctionCallback | |
►CMessageManager | This class is in charge of the application's event-dispatch loop |
►CLock | A lock you can use to lock the message manager |
CBlockingMessage | |
CMessageBase | Internal class used as the base class for all message objects |
CMessageManagerLock | Used to make sure that the calling thread has exclusive access to the message loop |
CMountedVolumeListChangeDetector | An instance of this class will provide callbacks when drives are mounted or unmounted on the system |
CMultiTimerCallback | |
CMultiTimer | A type of timer class that can run multiple timers with different frequencies, all of which share a single callback |
CLambdaInvoker | |
►CTimer | Makes repeated callbacks to a virtual method at a specified time interval |
CTimerThread | |