Exceptions
Exceptions 2
Symfony\Component\HttpKernel\Exception\ NotFoundHttpException
Show exception properties
Symfony\Component\HttpKernel\Exception\NotFoundHttpException {#187 -statusCode: 404 -headers: [] }
- if ($referer = $request->headers->get('referer')) {
- $message .= sprintf(' (from "%s")', $referer);
- }
- throw new NotFoundHttpException($message, $e);
- } catch (MethodNotAllowedException $e) {
- $message = sprintf('No route found for "%s %s": Method Not Allowed (Allow: %s)', $request->getMethod(), $request->getUriForPath($request->getPathInfo()), implode(', ', $e->getAllowedMethods()));
- throw new MethodNotAllowedHttpException($e->getAllowedMethods(), $message, $e);
- }
            
        
    
    
                    
            in
            
                vendor/symfony/event-dispatcher/Debug/WrappedListener.php
            
                            ->
                onKernelRequest
                        (line 115)
            
        
    
    - $this->priority ??= $dispatcher->getListenerPriority($eventName, $this->listener);
- $e = $this->stopwatch->start($this->name, 'event_listener');
- try {
- ($this->optimizedListener ?? $this->listener)($event, $eventName, $dispatcher);
- } finally {
- if ($e->isStarted()) {
- $e->stop();
- }
- }
            
        
    
    
                    
            in
            
                vendor/symfony/event-dispatcher/EventDispatcher.php
            
                            ->
                __invoke
                        (line 206)
            
        
    
    - foreach ($listeners as $listener) {
- if ($stoppable && $event->isPropagationStopped()) {
- break;
- }
- $listener($event, $eventName, $this);
- }
- }
- /**
- * Sorts the internal list of listeners for the given event by priority.
            
        
    
    
                    
            in
            
                vendor/symfony/event-dispatcher/EventDispatcher.php
            
                            ->
                callListeners
                        (line 56)
            
        
    
    - } else {
- $listeners = $this->getListeners($eventName);
- }
- if ($listeners) {
- $this->callListeners($listeners, $eventName, $event);
- }
- return $event;
- }
            
        
    
            EventDispatcher->dispatch(object(RequestEvent), 'kernel.request')    
                    
            in
            
                src/Core/Content/Flow/Dispatching/FlowDispatcher.php
            
                        (line 50)
            
        
    
    - *
- * @return TEvent
- */
- public function dispatch(object $event, ?string $eventName = null): object
- {
- $event = $this->dispatcher->dispatch($event, $eventName);
- if (!$event instanceof FlowEventAware) {
- return $event;
- }
            
        
    
            FlowDispatcher->dispatch(object(RequestEvent), 'kernel.request')    
                    
            in
            
                src/Core/Framework/Webhook/WebhookDispatcher.php
            
                        (line 70)
            
        
    
    - ) {
- }
- public function dispatch(object $event, ?string $eventName = null): object
- {
- $event = $this->dispatcher->dispatch($event, $eventName);
- if (EnvironmentHelper::getVariable('DISABLE_EXTENSIONS', false)) {
- return $event;
- }
            
        
    
            WebhookDispatcher->dispatch(object(RequestEvent), 'kernel.request')    
                    
            in
            
                src/Core/Framework/Event/NestedEventDispatcher.php
            
                        (line 31)
            
        
    
    - }
- $this->dispatch($nested, $name);
- }
- }
- return $this->dispatcher->dispatch($event, $eventName);
- }
- /**
- * @param callable $listener can not use native type declaration @see https://github.com/symfony/symfony/issues/42283
- */
            
        
    
    
                    
            in
            
                vendor/symfony/event-dispatcher/Debug/TraceableEventDispatcher.php
            
                            ->
                dispatch
                        (line 122)
            
        
    
    - try {
- $this->beforeDispatch($eventName, $event);
- try {
- $e = $this->stopwatch->start($eventName, 'section');
- try {
- $this->dispatcher->dispatch($event, $eventName);
- } finally {
- if ($e->isStarted()) {
- $e->stop();
- }
- }
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpKernel.php
            
                            ->
                dispatch
                        (line 159)
            
        
    
    - */
- private function handleRaw(Request $request, int $type = self::MAIN_REQUEST): Response
- {
- // request
- $event = new RequestEvent($this, $request, $type);
- $this->dispatcher->dispatch($event, KernelEvents::REQUEST);
- if ($event->hasResponse()) {
- return $this->filterResponse($event->getResponse(), $request, $type);
- }
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpKernel.php
            
                            ->
                handleRaw
                        (line 76)
            
        
    
    - $request->headers->set('X-Php-Ob-Level', (string) ob_get_level());
- $this->requestStack->push($request);
- $response = null;
- try {
- return $response = $this->handleRaw($request, $type);
- } catch (\Throwable $e) {
- if ($e instanceof \Error && !$this->handleAllThrowables) {
- throw $e;
- }
            
        
    
            HttpKernel->handle(object(Request), 1, true)    
                    
            in
            
                src/Core/Framework/Adapter/Kernel/HttpKernel.php
            
                        (line 72)
            
        
    
    - $this->dispatcher->dispatch($event);
- return $event->getResponse();
- }
- return parent::handle($request, $type, $catch);
- }
- }
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpCache/SubRequestHandler.php
            
                            ->
                handle
                        (line 86)
            
        
    
    - if (!IpUtils::checkIp('127.0.0.1', $trustedProxies)) {
- Request::setTrustedProxies(array_merge($trustedProxies, ['127.0.0.1']), Request::getTrustedHeaderSet());
- }
- try {
- return $kernel->handle($request, $type, $catch);
- } finally {
- // restore global state
- Request::setTrustedProxies($trustedProxies, $trustedHeaderSet);
- }
- }
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpCache/HttpCache.php
            
                            ::
                handle
                        (line 461)
            
        
    
    - protected function forward(Request $request, bool $catch = false, ?Response $entry = null): Response
- {
- $this->surrogate?->addSurrogateCapability($request);
- // always a "master" request (as the real master request can be in cache)
- $response = SubRequestHandler::handle($this->kernel, $request, HttpKernelInterface::MAIN_REQUEST, $catch);
- /*
- * Support stale-if-error given on Responses or as a config option.
- * RFC 7234 summarizes in Section 4.2.4 (but also mentions with the individual
- * Cache-Control directives) that
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpCache/HttpCache.php
            
                            ->
                forward
                        (line 438)
            
        
    
    - // avoid that the backend sends no content
- $subRequest->headers->remove('If-Modified-Since');
- $subRequest->headers->remove('If-None-Match');
- $response = $this->forward($subRequest, $catch);
- if ($response->isCacheable()) {
- $this->store($request, $response);
- }
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpCache/HttpCache.php
            
                            ->
                fetch
                        (line 336)
            
        
    
    - }
- if (null === $entry) {
- $this->record($request, 'miss');
- return $this->fetch($request, $catch);
- }
- if (!$this->isFreshEnough($request, $entry)) {
- $this->record($request, 'stale');
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpCache/HttpCache.php
            
                            ->
                lookup
                        (line 214)
            
        
    
    - reload the cache by fetching a fresh response and caching it (if possible).
- */
- $this->record($request, 'reload');
- $response = $this->fetch($request, $catch);
- } else {
- $response = $this->lookup($request, $catch);
- }
- $this->restoreResponseBody($request, $response);
- if (HttpKernelInterface::MAIN_REQUEST === $type) {
            
        
    
            HttpCache->handle(object(Request), 1, true)    
                    
            in
            
                src/Core/Framework/Adapter/Kernel/HttpCacheKernel.php
            
                        (line 65)
            
        
    
    - // only handle main request inside http cache, because ESI tags are also interpreted as main request.
- // sub requests are requests, which are forwarded to the kernel inside the php stack
- // https://github.com/symfony/symfony/issues/51648#issuecomment-1717846894
- if ($type === HttpKernelInterface::MAIN_REQUEST) {
- $response = parent::handle($request, $type, $catch);
- } elseif ($request->attributes->has('_sw_esi')) {
- $response = parent::handle($request, $type, $catch);
- } else {
- $response = $this->getKernel()->handle($request, $type, $catch);
- }
- {
- if (!$this->booted) {
- $this->boot();
- }
- return $this->getHttpKernel()->handle($request, $type, $catch);
- }
- public function boot(): void
- {
- if ($this->booted === true) {
            
        
    
    
                    
            in
            
                vendor/symfony/runtime/Runner/Symfony/HttpKernelRunner.php
            
                            ->
                handle
                        (line 35)
            
        
    
    - ) {
- }
- public function run(): int
- {
- $response = $this->kernel->handle($this->request);
- if (Kernel::VERSION_ID >= 60400) {
- $response->send(false);
- if (\function_exists('fastcgi_finish_request') && !$this->debug) {
            
        
    
    
                    
            in
            
                vendor/autoload_runtime.php
            
                            ->
                run
                        (line 29)
            
        
    
    - $app = $app(...$args);
- exit(
- $runtime
- ->getRunner($app)
- ->run()
- );
- use Shopware\Core\Framework\Plugin\KernelPluginLoader\ComposerPluginLoader;
- use Shopware\Core\Installer\InstallerKernel;
- $_SERVER['SCRIPT_FILENAME'] = __FILE__;
- require_once __DIR__ . '/../vendor/autoload_runtime.php';
- if (!file_exists(__DIR__ . '/../.env') && !file_exists(__DIR__ . '/../.env.dist') && !file_exists(__DIR__ . '/../.env.local.php')) {
- $_SERVER['APP_RUNTIME_OPTIONS']['disable_dotenv'] = true;
- }
Symfony\Component\Routing\Exception\ ResourceNotFoundException
- if ($allowSchemes) {
- goto redirect_scheme;
- }
- }
- throw new ResourceNotFoundException(sprintf('No routes found for "%s".', $pathinfo));
- }
- private function doMatch(string $pathinfo, array &$allow = [], array &$allowSchemes = []): array
- {
- $allow = $allowSchemes = [];
            
        
    
    
                    
            in
            
                vendor/symfony/routing/Matcher/UrlMatcher.php
            
                            ->
                match
                        (line 89)
            
        
    
    - public function matchRequest(Request $request): array
- {
- $this->request = $request;
- $ret = $this->match($request->getPathInfo());
- $this->request = null;
- return $ret;
- }
            
        
    
    
                    
            in
            
                vendor/symfony/routing/Router.php
            
                            ->
                matchRequest
                        (line 190)
            
        
    
    - if (!$matcher instanceof RequestMatcherInterface) {
- // fallback to the default UrlMatcherInterface
- return $matcher->match($request->getPathInfo());
- }
- return $matcher->matchRequest($request);
- }
- /**
- * Gets the UrlMatcher or RequestMatcher instance associated with this Router.
- */
- ['REQUEST_URI' => $request->attributes->get(RequestTransformer::SALES_CHANNEL_RESOLVED_URI)]
- );
- $localClone = $request->duplicate(null, null, null, null, null, $server);
- return $this->decorated->matchRequest($localClone);
- }
- public function setContext(RequestContext $context): void
- {
- $this->decorated->setContext($context);
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/EventListener/RouterListener.php
            
                            ->
                matchRequest
                        (line 101)
            
        
    
    - // add attributes based on the request (routing)
- try {
- // matching a request is more powerful than matching a URL path + context, so try that first
- if ($this->matcher instanceof RequestMatcherInterface) {
- $parameters = $this->matcher->matchRequest($request);
- } else {
- $parameters = $this->matcher->match($request->getPathInfo());
- }
- $this->logger?->info('Matched route "{route}".', [
            
        
    
    
                    
            in
            
                vendor/symfony/event-dispatcher/Debug/WrappedListener.php
            
                            ->
                onKernelRequest
                        (line 115)
            
        
    
    - $this->priority ??= $dispatcher->getListenerPriority($eventName, $this->listener);
- $e = $this->stopwatch->start($this->name, 'event_listener');
- try {
- ($this->optimizedListener ?? $this->listener)($event, $eventName, $dispatcher);
- } finally {
- if ($e->isStarted()) {
- $e->stop();
- }
- }
            
        
    
    
                    
            in
            
                vendor/symfony/event-dispatcher/EventDispatcher.php
            
                            ->
                __invoke
                        (line 206)
            
        
    
    - foreach ($listeners as $listener) {
- if ($stoppable && $event->isPropagationStopped()) {
- break;
- }
- $listener($event, $eventName, $this);
- }
- }
- /**
- * Sorts the internal list of listeners for the given event by priority.
            
        
    
    
                    
            in
            
                vendor/symfony/event-dispatcher/EventDispatcher.php
            
                            ->
                callListeners
                        (line 56)
            
        
    
    - } else {
- $listeners = $this->getListeners($eventName);
- }
- if ($listeners) {
- $this->callListeners($listeners, $eventName, $event);
- }
- return $event;
- }
            
        
    
            EventDispatcher->dispatch(object(RequestEvent), 'kernel.request')    
                    
            in
            
                src/Core/Content/Flow/Dispatching/FlowDispatcher.php
            
                        (line 50)
            
        
    
    - *
- * @return TEvent
- */
- public function dispatch(object $event, ?string $eventName = null): object
- {
- $event = $this->dispatcher->dispatch($event, $eventName);
- if (!$event instanceof FlowEventAware) {
- return $event;
- }
            
        
    
            FlowDispatcher->dispatch(object(RequestEvent), 'kernel.request')    
                    
            in
            
                src/Core/Framework/Webhook/WebhookDispatcher.php
            
                        (line 70)
            
        
    
    - ) {
- }
- public function dispatch(object $event, ?string $eventName = null): object
- {
- $event = $this->dispatcher->dispatch($event, $eventName);
- if (EnvironmentHelper::getVariable('DISABLE_EXTENSIONS', false)) {
- return $event;
- }
            
        
    
            WebhookDispatcher->dispatch(object(RequestEvent), 'kernel.request')    
                    
            in
            
                src/Core/Framework/Event/NestedEventDispatcher.php
            
                        (line 31)
            
        
    
    - }
- $this->dispatch($nested, $name);
- }
- }
- return $this->dispatcher->dispatch($event, $eventName);
- }
- /**
- * @param callable $listener can not use native type declaration @see https://github.com/symfony/symfony/issues/42283
- */
            
        
    
    
                    
            in
            
                vendor/symfony/event-dispatcher/Debug/TraceableEventDispatcher.php
            
                            ->
                dispatch
                        (line 122)
            
        
    
    - try {
- $this->beforeDispatch($eventName, $event);
- try {
- $e = $this->stopwatch->start($eventName, 'section');
- try {
- $this->dispatcher->dispatch($event, $eventName);
- } finally {
- if ($e->isStarted()) {
- $e->stop();
- }
- }
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpKernel.php
            
                            ->
                dispatch
                        (line 159)
            
        
    
    - */
- private function handleRaw(Request $request, int $type = self::MAIN_REQUEST): Response
- {
- // request
- $event = new RequestEvent($this, $request, $type);
- $this->dispatcher->dispatch($event, KernelEvents::REQUEST);
- if ($event->hasResponse()) {
- return $this->filterResponse($event->getResponse(), $request, $type);
- }
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpKernel.php
            
                            ->
                handleRaw
                        (line 76)
            
        
    
    - $request->headers->set('X-Php-Ob-Level', (string) ob_get_level());
- $this->requestStack->push($request);
- $response = null;
- try {
- return $response = $this->handleRaw($request, $type);
- } catch (\Throwable $e) {
- if ($e instanceof \Error && !$this->handleAllThrowables) {
- throw $e;
- }
            
        
    
            HttpKernel->handle(object(Request), 1, true)    
                    
            in
            
                src/Core/Framework/Adapter/Kernel/HttpKernel.php
            
                        (line 72)
            
        
    
    - $this->dispatcher->dispatch($event);
- return $event->getResponse();
- }
- return parent::handle($request, $type, $catch);
- }
- }
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpCache/SubRequestHandler.php
            
                            ->
                handle
                        (line 86)
            
        
    
    - if (!IpUtils::checkIp('127.0.0.1', $trustedProxies)) {
- Request::setTrustedProxies(array_merge($trustedProxies, ['127.0.0.1']), Request::getTrustedHeaderSet());
- }
- try {
- return $kernel->handle($request, $type, $catch);
- } finally {
- // restore global state
- Request::setTrustedProxies($trustedProxies, $trustedHeaderSet);
- }
- }
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpCache/HttpCache.php
            
                            ::
                handle
                        (line 461)
            
        
    
    - protected function forward(Request $request, bool $catch = false, ?Response $entry = null): Response
- {
- $this->surrogate?->addSurrogateCapability($request);
- // always a "master" request (as the real master request can be in cache)
- $response = SubRequestHandler::handle($this->kernel, $request, HttpKernelInterface::MAIN_REQUEST, $catch);
- /*
- * Support stale-if-error given on Responses or as a config option.
- * RFC 7234 summarizes in Section 4.2.4 (but also mentions with the individual
- * Cache-Control directives) that
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpCache/HttpCache.php
            
                            ->
                forward
                        (line 438)
            
        
    
    - // avoid that the backend sends no content
- $subRequest->headers->remove('If-Modified-Since');
- $subRequest->headers->remove('If-None-Match');
- $response = $this->forward($subRequest, $catch);
- if ($response->isCacheable()) {
- $this->store($request, $response);
- }
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpCache/HttpCache.php
            
                            ->
                fetch
                        (line 336)
            
        
    
    - }
- if (null === $entry) {
- $this->record($request, 'miss');
- return $this->fetch($request, $catch);
- }
- if (!$this->isFreshEnough($request, $entry)) {
- $this->record($request, 'stale');
            
        
    
    
                    
            in
            
                vendor/symfony/http-kernel/HttpCache/HttpCache.php
            
                            ->
                lookup
                        (line 214)
            
        
    
    - reload the cache by fetching a fresh response and caching it (if possible).
- */
- $this->record($request, 'reload');
- $response = $this->fetch($request, $catch);
- } else {
- $response = $this->lookup($request, $catch);
- }
- $this->restoreResponseBody($request, $response);
- if (HttpKernelInterface::MAIN_REQUEST === $type) {
            
        
    
            HttpCache->handle(object(Request), 1, true)    
                    
            in
            
                src/Core/Framework/Adapter/Kernel/HttpCacheKernel.php
            
                        (line 65)
            
        
    
    - // only handle main request inside http cache, because ESI tags are also interpreted as main request.
- // sub requests are requests, which are forwarded to the kernel inside the php stack
- // https://github.com/symfony/symfony/issues/51648#issuecomment-1717846894
- if ($type === HttpKernelInterface::MAIN_REQUEST) {
- $response = parent::handle($request, $type, $catch);
- } elseif ($request->attributes->has('_sw_esi')) {
- $response = parent::handle($request, $type, $catch);
- } else {
- $response = $this->getKernel()->handle($request, $type, $catch);
- }
- {
- if (!$this->booted) {
- $this->boot();
- }
- return $this->getHttpKernel()->handle($request, $type, $catch);
- }
- public function boot(): void
- {
- if ($this->booted === true) {
            
        
    
    
                    
            in
            
                vendor/symfony/runtime/Runner/Symfony/HttpKernelRunner.php
            
                            ->
                handle
                        (line 35)
            
        
    
    - ) {
- }
- public function run(): int
- {
- $response = $this->kernel->handle($this->request);
- if (Kernel::VERSION_ID >= 60400) {
- $response->send(false);
- if (\function_exists('fastcgi_finish_request') && !$this->debug) {
            
        
    
    
                    
            in
            
                vendor/autoload_runtime.php
            
                            ->
                run
                        (line 29)
            
        
    
    - $app = $app(...$args);
- exit(
- $runtime
- ->getRunner($app)
- ->run()
- );
- use Shopware\Core\Framework\Plugin\KernelPluginLoader\ComposerPluginLoader;
- use Shopware\Core\Installer\InstallerKernel;
- $_SERVER['SCRIPT_FILENAME'] = __FILE__;
- require_once __DIR__ . '/../vendor/autoload_runtime.php';
- if (!file_exists(__DIR__ . '/../.env') && !file_exists(__DIR__ . '/../.env.dist') && !file_exists(__DIR__ . '/../.env.local.php')) {
- $_SERVER['APP_RUNTIME_OPTIONS']['disable_dotenv'] = true;
- }
Logs
| Level | Channel | Message | 
|---|---|---|
| INFO 23:50:14 | request | Matched route "_profiler". {
    "route": "_profiler",
    "route_parameters": {
        "_route": "_profiler",
        "_controller": "web_profiler.controller.profiler::panelAction",
        "token": "latest"
    },
    "request_uri": "https://sw66.test.firebearstudio.com/_profiler/latest?q=%2F_profiler%2Fd40b6d&type=request",
    "method": "GET"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Api\EventListener\CorsListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\CorsListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\DebugHandlersListener::configure". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\DebugHandlersListener::configure"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\ValidateRequestListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\ValidateRequestListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Api\EventListener\JsonRequestTransformerListener::onRequest". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\JsonRequestTransformerListener::onRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Api\EventListener\Authentication\ApiAuthenticationListener::setupOAuth". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\Authentication\\ApiAuthenticationListener::setupOAuth"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\SessionListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\SessionListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\LocaleListener::setDefaultLocale". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\LocaleListener::setDefaultLocale"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\FragmentListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\FragmentListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Framework\Routing\StorefrontSubscriber::startSession". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Framework\\Routing\\StorefrontSubscriber::startSession"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\RouterListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\RouterListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\LocaleListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\LocaleListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\LocaleAwareListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\LocaleAwareListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Routing\RouteParamsCleanupListener::__invoke". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Routing\\RouteParamsCleanupListener::__invoke"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Framework\Twig\TwigDateRequestListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Framework\\Twig\\TwigDateRequestListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Routing\CoreSubscriber::initializeCspNonce". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Routing\\CoreSubscriber::initializeCspNonce"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Framework\Routing\StorefrontSubscriber::maintenanceResolver". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Framework\\Routing\\StorefrontSubscriber::maintenanceResolver"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Theme\Twig\ThemeNamespaceHierarchyBuilder::requestEvent". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Theme\\Twig\\ThemeNamespaceHierarchyBuilder::requestEvent"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Routing\RouteEventSubscriber::request". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Routing\\RouteEventSubscriber::request"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Symfony\Bundle\FrameworkBundle\DataCollector\RouterDataCollector::onKernelController". {
    "event": "kernel.controller",
    "listener": "Symfony\\Bundle\\FrameworkBundle\\DataCollector\\RouterDataCollector::onKernelController"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Symfony\Component\HttpKernel\DataCollector\RequestDataCollector::onKernelController". {
    "event": "kernel.controller",
    "listener": "Symfony\\Component\\HttpKernel\\DataCollector\\RequestDataCollector::onKernelController"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\EventListener\Authentication\SalesChannelAuthenticationListener::validateRequest". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\Authentication\\SalesChannelAuthenticationListener::validateRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\EventListener\Authentication\ApiAuthenticationListener::validateRequest". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\Authentication\\ApiAuthenticationListener::validateRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Routing\ContextResolverListener::resolveContext". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Routing\\ContextResolverListener::resolveContext"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Routing\RouteScopeListener::checkScope". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Routing\\RouteScopeListener::checkScope"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\Acl\AclAnnotationValidator::validate". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\Acl\\AclAnnotationValidator::validate"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Storefront\Framework\Routing\StorefrontSubscriber::preventPageLoadingFromXmlHttpRequest". {
    "event": "kernel.controller",
    "listener": "Shopware\\Storefront\\Framework\\Routing\\StorefrontSubscriber::preventPageLoadingFromXmlHttpRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Storefront\Framework\Captcha\CaptchaRouteListener::validateCaptcha". {
    "event": "kernel.controller",
    "listener": "Shopware\\Storefront\\Framework\\Captcha\\CaptchaRouteListener::validateCaptcha"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Adapter\Cache\CacheStateSubscriber::setStates". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Adapter\\Cache\\CacheStateSubscriber::setStates"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\EventListener\ExpectationSubscriber::checkExpectations". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\ExpectationSubscriber::checkExpectations"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Storefront\Framework\AffiliateTracking\AffiliateTrackingListener::checkAffiliateTracking". {
    "event": "kernel.controller",
    "listener": "Shopware\\Storefront\\Framework\\AffiliateTracking\\AffiliateTrackingListener::checkAffiliateTracking"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller_arguments" to listener "Symfony\Component\HttpKernel\EventListener\CacheAttributeListener::onKernelControllerArguments". {
    "event": "kernel.controller_arguments",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\CacheAttributeListener::onKernelControllerArguments"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller_arguments" to listener "ContainerR8r4lfh\RequestPayloadValueResolverGhost8c80924::onKernelControllerArguments". {
    "event": "kernel.controller_arguments",
    "listener": "ContainerR8r4lfh\\RequestPayloadValueResolverGhost8c80924::onKernelControllerArguments"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller_arguments" to listener "Symfony\Component\HttpKernel\EventListener\ErrorListener::onControllerArguments". {
    "event": "kernel.controller_arguments",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\ErrorListener::onControllerArguments"
} | 
| DEBUG 23:50:14 | event | Notified event "Shopware\Core\Framework\Event\BeforeSendResponseEvent" to listener "Shopware\Core\Framework\Adapter\Cache\Http\CacheControlListener::__invoke". {
    "event": "Shopware\\Core\\Framework\\Event\\BeforeSendResponseEvent",
    "listener": "Shopware\\Core\\Framework\\Adapter\\Cache\\Http\\CacheControlListener::__invoke"
} | 
| DEBUG 23:50:14 | event | Notified event "Shopware\Core\Framework\Event\BeforeSendResponseEvent" to listener "Shopware\Storefront\Framework\Routing\CanonicalLinkListener::__invoke". {
    "event": "Shopware\\Core\\Framework\\Event\\BeforeSendResponseEvent",
    "listener": "Shopware\\Storefront\\Framework\\Routing\\CanonicalLinkListener::__invoke"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Api\EventListener\CorsListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\CorsListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\DebugHandlersListener::configure". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\DebugHandlersListener::configure"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\ValidateRequestListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\ValidateRequestListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Api\EventListener\JsonRequestTransformerListener::onRequest". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\JsonRequestTransformerListener::onRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Api\EventListener\Authentication\ApiAuthenticationListener::setupOAuth". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\Authentication\\ApiAuthenticationListener::setupOAuth"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\SessionListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\SessionListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\LocaleListener::setDefaultLocale". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\LocaleListener::setDefaultLocale"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\FragmentListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\FragmentListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Framework\Routing\StorefrontSubscriber::startSession". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Framework\\Routing\\StorefrontSubscriber::startSession"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\RouterListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\RouterListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\LocaleListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\LocaleListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\LocaleAwareListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\LocaleAwareListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Routing\RouteParamsCleanupListener::__invoke". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Routing\\RouteParamsCleanupListener::__invoke"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Framework\Twig\TwigDateRequestListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Framework\\Twig\\TwigDateRequestListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Routing\CoreSubscriber::initializeCspNonce". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Routing\\CoreSubscriber::initializeCspNonce"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Framework\Routing\StorefrontSubscriber::maintenanceResolver". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Framework\\Routing\\StorefrontSubscriber::maintenanceResolver"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Theme\Twig\ThemeNamespaceHierarchyBuilder::requestEvent". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Theme\\Twig\\ThemeNamespaceHierarchyBuilder::requestEvent"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Routing\RouteEventSubscriber::request". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Routing\\RouteEventSubscriber::request"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Symfony\Bundle\FrameworkBundle\DataCollector\RouterDataCollector::onKernelController". {
    "event": "kernel.controller",
    "listener": "Symfony\\Bundle\\FrameworkBundle\\DataCollector\\RouterDataCollector::onKernelController"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Symfony\Component\HttpKernel\DataCollector\RequestDataCollector::onKernelController". {
    "event": "kernel.controller",
    "listener": "Symfony\\Component\\HttpKernel\\DataCollector\\RequestDataCollector::onKernelController"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\EventListener\Authentication\SalesChannelAuthenticationListener::validateRequest". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\Authentication\\SalesChannelAuthenticationListener::validateRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\EventListener\Authentication\ApiAuthenticationListener::validateRequest". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\Authentication\\ApiAuthenticationListener::validateRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Routing\ContextResolverListener::resolveContext". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Routing\\ContextResolverListener::resolveContext"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Routing\RouteScopeListener::checkScope". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Routing\\RouteScopeListener::checkScope"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\Acl\AclAnnotationValidator::validate". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\Acl\\AclAnnotationValidator::validate"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Storefront\Framework\Routing\StorefrontSubscriber::preventPageLoadingFromXmlHttpRequest". {
    "event": "kernel.controller",
    "listener": "Shopware\\Storefront\\Framework\\Routing\\StorefrontSubscriber::preventPageLoadingFromXmlHttpRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Storefront\Framework\Captcha\CaptchaRouteListener::validateCaptcha". {
    "event": "kernel.controller",
    "listener": "Shopware\\Storefront\\Framework\\Captcha\\CaptchaRouteListener::validateCaptcha"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Adapter\Cache\CacheStateSubscriber::setStates". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Adapter\\Cache\\CacheStateSubscriber::setStates"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\EventListener\ExpectationSubscriber::checkExpectations". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\ExpectationSubscriber::checkExpectations"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Storefront\Framework\AffiliateTracking\AffiliateTrackingListener::checkAffiliateTracking". {
    "event": "kernel.controller",
    "listener": "Shopware\\Storefront\\Framework\\AffiliateTracking\\AffiliateTrackingListener::checkAffiliateTracking"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller_arguments" to listener "Symfony\Component\HttpKernel\EventListener\CacheAttributeListener::onKernelControllerArguments". {
    "event": "kernel.controller_arguments",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\CacheAttributeListener::onKernelControllerArguments"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller_arguments" to listener "ContainerR8r4lfh\RequestPayloadValueResolverGhost8c80924::onKernelControllerArguments". {
    "event": "kernel.controller_arguments",
    "listener": "ContainerR8r4lfh\\RequestPayloadValueResolverGhost8c80924::onKernelControllerArguments"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller_arguments" to listener "Symfony\Component\HttpKernel\EventListener\ErrorListener::onControllerArguments". {
    "event": "kernel.controller_arguments",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\ErrorListener::onControllerArguments"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Shopware\Core\Content\Seo\SalesChannel\StoreApiSeoResolver::addSeoInformation". {
    "event": "kernel.response",
    "listener": "Shopware\\Core\\Content\\Seo\\SalesChannel\\StoreApiSeoResolver::addSeoInformation"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Shopware\Core\System\SalesChannel\Api\StoreApiResponseListener::encodeResponse". {
    "event": "kernel.response",
    "listener": "Shopware\\Core\\System\\SalesChannel\\Api\\StoreApiResponseListener::encodeResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Shopware\Core\Framework\Api\EventListener\CorsListener::onKernelResponse". {
    "event": "kernel.response",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\CorsListener::onKernelResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Shopware\Core\Framework\Adapter\Cache\Http\CacheResponseSubscriber::setResponseCacheHeader". {
    "event": "kernel.response",
    "listener": "Shopware\\Core\\Framework\\Adapter\\Cache\\Http\\CacheResponseSubscriber::setResponseCacheHeader"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Shopware\Core\Profiling\Integration\ServerTiming::onResponseEvent". {
    "event": "kernel.response",
    "listener": "Shopware\\Core\\Profiling\\Integration\\ServerTiming::onResponseEvent"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Shopware\Core\Framework\Routing\CoreSubscriber::setSecurityHeaders". {
    "event": "kernel.response",
    "listener": "Shopware\\Core\\Framework\\Routing\\CoreSubscriber::setSecurityHeaders"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Shopware\Core\Framework\Api\EventListener\ResponseHeaderListener::onResponse". {
    "event": "kernel.response",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\ResponseHeaderListener::onResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Symfony\Component\HttpKernel\EventListener\ResponseListener::onKernelResponse". {
    "event": "kernel.response",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\ResponseListener::onKernelResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Symfony\Component\HttpKernel\EventListener\SurrogateListener::onKernelResponse". {
    "event": "kernel.response",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\SurrogateListener::onKernelResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Symfony\Component\HttpKernel\DataCollector\RequestDataCollector::onKernelResponse". {
    "event": "kernel.response",
    "listener": "Symfony\\Component\\HttpKernel\\DataCollector\\RequestDataCollector::onKernelResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Shopware\Core\Framework\Routing\RouteEventSubscriber::response". {
    "event": "kernel.response",
    "listener": "Shopware\\Core\\Framework\\Routing\\RouteEventSubscriber::response"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Shopware\Storefront\Framework\Routing\ResponseHeaderListener::onResponse". {
    "event": "kernel.response",
    "listener": "Shopware\\Storefront\\Framework\\Routing\\ResponseHeaderListener::onResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Symfony\Component\HttpKernel\EventListener\CacheAttributeListener::onKernelResponse". {
    "event": "kernel.response",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\CacheAttributeListener::onKernelResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Symfony\Component\HttpKernel\EventListener\ProfilerListener::onKernelResponse". {
    "event": "kernel.response",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\ProfilerListener::onKernelResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Symfony\Component\HttpKernel\EventListener\ErrorListener::removeCspHeader". {
    "event": "kernel.response",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\ErrorListener::removeCspHeader"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Symfony\Bundle\WebProfilerBundle\EventListener\WebDebugToolbarListener::onKernelResponse". {
    "event": "kernel.response",
    "listener": "Symfony\\Bundle\\WebProfilerBundle\\EventListener\\WebDebugToolbarListener::onKernelResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Symfony\Component\HttpKernel\EventListener\DisallowRobotsIndexingListener::onResponse". {
    "event": "kernel.response",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\DisallowRobotsIndexingListener::onResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Symfony\Component\HttpKernel\EventListener\SessionListener::onKernelResponse". {
    "event": "kernel.response",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\SessionListener::onKernelResponse"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.response" to listener "Shopware\Core\Framework\Adapter\Cache\Http\CacheResponseSubscriber::setResponseCache". {
    "event": "kernel.response",
    "listener": "Shopware\\Core\\Framework\\Adapter\\Cache\\Http\\CacheResponseSubscriber::setResponseCache"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.finish_request" to listener "Symfony\Component\HttpKernel\EventListener\LocaleListener::onKernelFinishRequest". {
    "event": "kernel.finish_request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\LocaleListener::onKernelFinishRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.finish_request" to listener "Symfony\Component\HttpKernel\EventListener\RouterListener::onKernelFinishRequest". {
    "event": "kernel.finish_request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\RouterListener::onKernelFinishRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.finish_request" to listener "Symfony\Component\HttpKernel\EventListener\LocaleAwareListener::onKernelFinishRequest". {
    "event": "kernel.finish_request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\LocaleAwareListener::onKernelFinishRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Api\EventListener\CorsListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\CorsListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\DebugHandlersListener::configure". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\DebugHandlersListener::configure"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\ValidateRequestListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\ValidateRequestListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Api\EventListener\JsonRequestTransformerListener::onRequest". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\JsonRequestTransformerListener::onRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Api\EventListener\Authentication\ApiAuthenticationListener::setupOAuth". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\Authentication\\ApiAuthenticationListener::setupOAuth"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\SessionListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\SessionListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\LocaleListener::setDefaultLocale". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\LocaleListener::setDefaultLocale"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\FragmentListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\FragmentListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Framework\Routing\StorefrontSubscriber::startSession". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Framework\\Routing\\StorefrontSubscriber::startSession"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\RouterListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\RouterListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\LocaleListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\LocaleListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Symfony\Component\HttpKernel\EventListener\LocaleAwareListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\LocaleAwareListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Routing\RouteParamsCleanupListener::__invoke". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Routing\\RouteParamsCleanupListener::__invoke"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Framework\Twig\TwigDateRequestListener::onKernelRequest". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Framework\\Twig\\TwigDateRequestListener::onKernelRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Routing\CoreSubscriber::initializeCspNonce". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Routing\\CoreSubscriber::initializeCspNonce"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Framework\Routing\StorefrontSubscriber::maintenanceResolver". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Framework\\Routing\\StorefrontSubscriber::maintenanceResolver"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Storefront\Theme\Twig\ThemeNamespaceHierarchyBuilder::requestEvent". {
    "event": "kernel.request",
    "listener": "Shopware\\Storefront\\Theme\\Twig\\ThemeNamespaceHierarchyBuilder::requestEvent"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.request" to listener "Shopware\Core\Framework\Routing\RouteEventSubscriber::request". {
    "event": "kernel.request",
    "listener": "Shopware\\Core\\Framework\\Routing\\RouteEventSubscriber::request"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Symfony\Bundle\FrameworkBundle\DataCollector\RouterDataCollector::onKernelController". {
    "event": "kernel.controller",
    "listener": "Symfony\\Bundle\\FrameworkBundle\\DataCollector\\RouterDataCollector::onKernelController"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Symfony\Component\HttpKernel\DataCollector\RequestDataCollector::onKernelController". {
    "event": "kernel.controller",
    "listener": "Symfony\\Component\\HttpKernel\\DataCollector\\RequestDataCollector::onKernelController"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\EventListener\Authentication\SalesChannelAuthenticationListener::validateRequest". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\Authentication\\SalesChannelAuthenticationListener::validateRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\EventListener\Authentication\ApiAuthenticationListener::validateRequest". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\Authentication\\ApiAuthenticationListener::validateRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Routing\ContextResolverListener::resolveContext". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Routing\\ContextResolverListener::resolveContext"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Routing\RouteScopeListener::checkScope". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Routing\\RouteScopeListener::checkScope"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\Acl\AclAnnotationValidator::validate". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\Acl\\AclAnnotationValidator::validate"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Storefront\Framework\Routing\StorefrontSubscriber::preventPageLoadingFromXmlHttpRequest". {
    "event": "kernel.controller",
    "listener": "Shopware\\Storefront\\Framework\\Routing\\StorefrontSubscriber::preventPageLoadingFromXmlHttpRequest"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Storefront\Framework\Captcha\CaptchaRouteListener::validateCaptcha". {
    "event": "kernel.controller",
    "listener": "Shopware\\Storefront\\Framework\\Captcha\\CaptchaRouteListener::validateCaptcha"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Adapter\Cache\CacheStateSubscriber::setStates". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Adapter\\Cache\\CacheStateSubscriber::setStates"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Core\Framework\Api\EventListener\ExpectationSubscriber::checkExpectations". {
    "event": "kernel.controller",
    "listener": "Shopware\\Core\\Framework\\Api\\EventListener\\ExpectationSubscriber::checkExpectations"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller" to listener "Shopware\Storefront\Framework\AffiliateTracking\AffiliateTrackingListener::checkAffiliateTracking". {
    "event": "kernel.controller",
    "listener": "Shopware\\Storefront\\Framework\\AffiliateTracking\\AffiliateTrackingListener::checkAffiliateTracking"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller_arguments" to listener "Symfony\Component\HttpKernel\EventListener\CacheAttributeListener::onKernelControllerArguments". {
    "event": "kernel.controller_arguments",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\CacheAttributeListener::onKernelControllerArguments"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller_arguments" to listener "ContainerR8r4lfh\RequestPayloadValueResolverGhost8c80924::onKernelControllerArguments". {
    "event": "kernel.controller_arguments",
    "listener": "ContainerR8r4lfh\\RequestPayloadValueResolverGhost8c80924::onKernelControllerArguments"
} | 
| DEBUG 23:50:14 | event | Notified event "kernel.controller_arguments" to listener "Symfony\Component\HttpKernel\EventListener\ErrorListener::onControllerArguments". {
    "event": "kernel.controller_arguments",
    "listener": "Symfony\\Component\\HttpKernel\\EventListener\\ErrorListener::onControllerArguments"
} | 
Stack Traces 2
| 
                                            [2/2]
                                        NotFoundHttpException                    
                    
                 | 
|---|
| 
Symfony\Component\HttpKernel\Exception\NotFoundHttpException:
No route found for "GET https://sw66.test.firebearstudio.com/robots.txt"
  at vendor/symfony/http-kernel/EventListener/RouterListener.php:149
  at Symfony\Component\HttpKernel\EventListener\RouterListener->onKernelRequest(object(RequestEvent), 'kernel.request', object(TraceableEventDispatcher))
     (vendor/symfony/event-dispatcher/Debug/WrappedListener.php:115)
  at Symfony\Component\EventDispatcher\Debug\WrappedListener->__invoke(object(RequestEvent), 'kernel.request', object(TraceableEventDispatcher))
     (vendor/symfony/event-dispatcher/EventDispatcher.php:206)
  at Symfony\Component\EventDispatcher\EventDispatcher->callListeners(array(object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener)), 'kernel.request', object(RequestEvent))
     (vendor/symfony/event-dispatcher/EventDispatcher.php:56)
  at Symfony\Component\EventDispatcher\EventDispatcher->dispatch(object(RequestEvent), 'kernel.request')
     (src/Core/Content/Flow/Dispatching/FlowDispatcher.php:50)
  at Shopware\Core\Content\Flow\Dispatching\FlowDispatcher->dispatch(object(RequestEvent), 'kernel.request')
     (src/Core/Framework/Webhook/WebhookDispatcher.php:70)
  at Shopware\Core\Framework\Webhook\WebhookDispatcher->dispatch(object(RequestEvent), 'kernel.request')
     (src/Core/Framework/Event/NestedEventDispatcher.php:31)
  at Shopware\Core\Framework\Event\NestedEventDispatcher->dispatch(object(RequestEvent), 'kernel.request')
     (vendor/symfony/event-dispatcher/Debug/TraceableEventDispatcher.php:122)
  at Symfony\Component\EventDispatcher\Debug\TraceableEventDispatcher->dispatch(object(RequestEvent), 'kernel.request')
     (vendor/symfony/http-kernel/HttpKernel.php:159)
  at Symfony\Component\HttpKernel\HttpKernel->handleRaw(object(Request), 1)
     (vendor/symfony/http-kernel/HttpKernel.php:76)
  at Symfony\Component\HttpKernel\HttpKernel->handle(object(Request), 1, true)
     (src/Core/Framework/Adapter/Kernel/HttpKernel.php:72)
  at Shopware\Core\Framework\Adapter\Kernel\HttpKernel->handle(object(Request), 1, true)
     (vendor/symfony/http-kernel/HttpCache/SubRequestHandler.php:86)
  at Symfony\Component\HttpKernel\HttpCache\SubRequestHandler::handle(object(HttpKernel), object(Request), 1, true)
     (vendor/symfony/http-kernel/HttpCache/HttpCache.php:461)
  at Symfony\Component\HttpKernel\HttpCache\HttpCache->forward(object(Request), true)
     (vendor/symfony/http-kernel/HttpCache/HttpCache.php:438)
  at Symfony\Component\HttpKernel\HttpCache\HttpCache->fetch(object(Request), true)
     (vendor/symfony/http-kernel/HttpCache/HttpCache.php:336)
  at Symfony\Component\HttpKernel\HttpCache\HttpCache->lookup(object(Request), true)
     (vendor/symfony/http-kernel/HttpCache/HttpCache.php:214)
  at Symfony\Component\HttpKernel\HttpCache\HttpCache->handle(object(Request), 1, true)
     (src/Core/Framework/Adapter/Kernel/HttpCacheKernel.php:65)
  at Shopware\Core\Framework\Adapter\Kernel\HttpCacheKernel->handle(object(Request), 1, true)
     (src/Core/Kernel.php:155)
  at Shopware\Core\Kernel->handle(object(Request))
     (vendor/symfony/runtime/Runner/Symfony/HttpKernelRunner.php:35)
  at Symfony\Component\Runtime\Runner\Symfony\HttpKernelRunner->run()
     (vendor/autoload_runtime.php:29)
  at require_once('/sw6/vendor/autoload_runtime.php')
     (public/index.php:10)                 | 
| 
                                            [1/2]
                                        ResourceNotFoundException                    
                    
                 | 
|---|
| 
Symfony\Component\Routing\Exception\ResourceNotFoundException:
No routes found for "/robots.txt/".
  at vendor/symfony/routing/Matcher/Dumper/CompiledUrlMatcherTrait.php:70
  at Symfony\Component\Routing\Matcher\CompiledUrlMatcher->match('/robots.txt/')
     (vendor/symfony/routing/Matcher/UrlMatcher.php:89)
  at Symfony\Component\Routing\Matcher\UrlMatcher->matchRequest(object(Request))
     (vendor/symfony/routing/Router.php:190)
  at Symfony\Component\Routing\Router->matchRequest(object(Request))
     (src/Storefront/Framework/Routing/Router.php:66)
  at Shopware\Storefront\Framework\Routing\Router->matchRequest(object(Request))
     (vendor/symfony/http-kernel/EventListener/RouterListener.php:101)
  at Symfony\Component\HttpKernel\EventListener\RouterListener->onKernelRequest(object(RequestEvent), 'kernel.request', object(TraceableEventDispatcher))
     (vendor/symfony/event-dispatcher/Debug/WrappedListener.php:115)
  at Symfony\Component\EventDispatcher\Debug\WrappedListener->__invoke(object(RequestEvent), 'kernel.request', object(TraceableEventDispatcher))
     (vendor/symfony/event-dispatcher/EventDispatcher.php:206)
  at Symfony\Component\EventDispatcher\EventDispatcher->callListeners(array(object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener), object(WrappedListener)), 'kernel.request', object(RequestEvent))
     (vendor/symfony/event-dispatcher/EventDispatcher.php:56)
  at Symfony\Component\EventDispatcher\EventDispatcher->dispatch(object(RequestEvent), 'kernel.request')
     (src/Core/Content/Flow/Dispatching/FlowDispatcher.php:50)
  at Shopware\Core\Content\Flow\Dispatching\FlowDispatcher->dispatch(object(RequestEvent), 'kernel.request')
     (src/Core/Framework/Webhook/WebhookDispatcher.php:70)
  at Shopware\Core\Framework\Webhook\WebhookDispatcher->dispatch(object(RequestEvent), 'kernel.request')
     (src/Core/Framework/Event/NestedEventDispatcher.php:31)
  at Shopware\Core\Framework\Event\NestedEventDispatcher->dispatch(object(RequestEvent), 'kernel.request')
     (vendor/symfony/event-dispatcher/Debug/TraceableEventDispatcher.php:122)
  at Symfony\Component\EventDispatcher\Debug\TraceableEventDispatcher->dispatch(object(RequestEvent), 'kernel.request')
     (vendor/symfony/http-kernel/HttpKernel.php:159)
  at Symfony\Component\HttpKernel\HttpKernel->handleRaw(object(Request), 1)
     (vendor/symfony/http-kernel/HttpKernel.php:76)
  at Symfony\Component\HttpKernel\HttpKernel->handle(object(Request), 1, true)
     (src/Core/Framework/Adapter/Kernel/HttpKernel.php:72)
  at Shopware\Core\Framework\Adapter\Kernel\HttpKernel->handle(object(Request), 1, true)
     (vendor/symfony/http-kernel/HttpCache/SubRequestHandler.php:86)
  at Symfony\Component\HttpKernel\HttpCache\SubRequestHandler::handle(object(HttpKernel), object(Request), 1, true)
     (vendor/symfony/http-kernel/HttpCache/HttpCache.php:461)
  at Symfony\Component\HttpKernel\HttpCache\HttpCache->forward(object(Request), true)
     (vendor/symfony/http-kernel/HttpCache/HttpCache.php:438)
  at Symfony\Component\HttpKernel\HttpCache\HttpCache->fetch(object(Request), true)
     (vendor/symfony/http-kernel/HttpCache/HttpCache.php:336)
  at Symfony\Component\HttpKernel\HttpCache\HttpCache->lookup(object(Request), true)
     (vendor/symfony/http-kernel/HttpCache/HttpCache.php:214)
  at Symfony\Component\HttpKernel\HttpCache\HttpCache->handle(object(Request), 1, true)
     (src/Core/Framework/Adapter/Kernel/HttpCacheKernel.php:65)
  at Shopware\Core\Framework\Adapter\Kernel\HttpCacheKernel->handle(object(Request), 1, true)
     (src/Core/Kernel.php:155)
  at Shopware\Core\Kernel->handle(object(Request))
     (vendor/symfony/runtime/Runner/Symfony/HttpKernelRunner.php:35)
  at Symfony\Component\Runtime\Runner\Symfony\HttpKernelRunner->run()
     (vendor/autoload_runtime.php:29)
  at require_once('/sw6/vendor/autoload_runtime.php')
     (public/index.php:10)                 |