Skip to content

Commit

Permalink
typo KostaFoulkes
Browse files Browse the repository at this point in the history
  • Loading branch information
stla committed Aug 5, 2024
1 parent 2de41e8 commit 540200e
Show file tree
Hide file tree
Showing 5 changed files with 42 additions and 7 deletions.
2 changes: 1 addition & 1 deletion NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -11,7 +11,7 @@ export(JackPol)
export(JackPolR)
export(JackR)
export(JackSymPol)
export(KostaFoulkesPolynomial)
export(KostkaFoulkesPolynomial)
export(KostkaJackNumbers)
export(KostkaJackNumbersWithGivenLambda)
export(LRmult)
Expand Down
4 changes: 2 additions & 2 deletions R/HallLittlewood.R
Original file line number Diff line number Diff line change
Expand Up @@ -86,7 +86,7 @@ ssytWord <- function(ssyt) {
#' @export
#' @importFrom qspray qlone qzero showQsprayOption<- showQsprayXYZ qsprayMaker
#' @importFrom syt ssytx_withGivenShapeAndWeight
KostaFoulkesPolynomial <- function(lambda, mu) {
KostkaFoulkesPolynomial <- function(lambda, mu) {
stopifnot(isPartition(lambda), isPartition(mu))
lambda <- removeTrailingZeros(as.integer(lambda))
mu <- removeTrailingZeros(as.integer(mu))
Expand Down Expand Up @@ -161,7 +161,7 @@ HallLittlewoodP <- function(n, lambda) {
names(kappas) <- vapply(kappas, partitionAsString, character(1L))
kappa <- kappas[[1L]]
lapply(kappas, function(mu) {
KostaFoulkesPolynomial(kappa, mu)
KostkaFoulkesPolynomial(kappa, mu)
})
})
names(kfs) <- lambdaStrings[i:length(lambdaStrings)]
Expand Down
2 changes: 1 addition & 1 deletion R/HallPolynomials.R
Original file line number Diff line number Diff line change
Expand Up @@ -38,7 +38,7 @@ msPolynomialInHLPbasis <- function(lambda) {
mu <- fromPartitionAsString(muAsString)
r <- msCombo[muAsString]
lapply(lambdas, function(kappa) {
r * KostaFoulkesPolynomial(mu, kappa)
r * KostkaFoulkesPolynomial(mu, kappa)
})
})
out <- Reduce(
Expand Down
35 changes: 35 additions & 0 deletions inst/essais/essai-GreenPolynomial-chiLambdaRho.R
Original file line number Diff line number Diff line change
@@ -0,0 +1,35 @@
library(jack)

#lambda <- c(3, 1)
mu <- c(2, 1, 1)
rho <- c(2, 2)

#jack:::chi_lambda_mu_rho(lambda, integer(0), rho)
chi_lambda_rho <- function(lambda, rho) {
jack:::chi_lambda_mu_rho(lambda, integer(0), rho)
}

Knumbers <- syt::KostkaNumbers(4)
lambdasAsStrings <- rownames(Knumbers)
lambdas <- lapply(lambdasAsStrings, jack:::fromPartitionAsString)

KFpolys <- lapply(lambdas, function(lambda) {
KostkaFoulkesPolynomial(lambda, mu)
})

chis <- lapply(lambdas, function(lambda) {
chi_lambda_rho(lambda, rho)
})

toAdd <- mapply(
function(chi, KFpoly) {
chi * KFpoly
},
chis, KFpolys,
USE.NAMES = FALSE, SIMPLIFY = FALSE
)

Reduce(`+`, toAdd)

GreenXpolynomials(rho = rho)

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 540200e

Please sign in to comment.